octane-0.18.2: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Text

Synopsis

Documentation

newtype Text Source #

A thin wrapper around Text.

Constructors

Text 

Fields

Instances

Eq Text Source # 

Methods

(==) :: Text -> Text -> Bool #

(/=) :: Text -> Text -> Bool #

Ord Text Source # 

Methods

compare :: Text -> Text -> Ordering #

(<) :: Text -> Text -> Bool #

(<=) :: Text -> Text -> Bool #

(>) :: Text -> Text -> Bool #

(>=) :: Text -> Text -> Bool #

max :: Text -> Text -> Text #

min :: Text -> Text -> Text #

Show Text Source #

Shown as a string literal, like "this".

Methods

showsPrec :: Int -> Text -> ShowS #

show :: Text -> String #

showList :: [Text] -> ShowS #

IsString Text Source #

Allows you to write Text as string literals with OverloadedStrings. Also allows using the fromString helper function.

Methods

fromString :: String -> Text #

ToJSON Text Source #

Encoded directly as a JSON string.

HasField "content" StrProperty Text # 

Methods

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

HasField "content" NameProperty Text # 

Methods

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

HasField "gameName" PrivateMatchSettingsValue Text # 
HasField "key" ByteProperty Text # 

Methods

getField :: Proxy# Symbol "key" -> ByteProperty -> Text #

HasField "mutators" PrivateMatchSettingsValue Text # 
HasField "name" PlayStationId Text # 

Methods

getField :: Proxy# Symbol "name" -> PlayStationId -> Text #

HasField "password" PrivateMatchSettingsValue Text # 
HasField "unpack" Text Text Source # 

Methods

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

HasField "unpack" StringValue Text # 

Methods

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

HasField "value" ByteProperty Text # 

Methods

getField :: Proxy# Symbol "value" -> ByteProperty -> Text #

ModifyField "content" StrProperty StrProperty Text Text # 

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 "content" NameProperty NameProperty Text Text # 

Methods

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

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

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

ModifyField "gameName" PrivateMatchSettingsValue PrivateMatchSettingsValue Text Text # 
ModifyField "key" ByteProperty ByteProperty Text Text # 
ModifyField "mutators" PrivateMatchSettingsValue PrivateMatchSettingsValue Text Text # 
ModifyField "name" PlayStationId PlayStationId Text Text # 
ModifyField "password" PrivateMatchSettingsValue PrivateMatchSettingsValue Text Text # 
ModifyField "unpack" Text Text Text Text Source # 

Methods

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

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

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

ModifyField "unpack" StringValue StringValue Text Text # 

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 #

ModifyField "value" ByteProperty ByteProperty Text Text # 
ModifyField "playerName" ReservationValue ReservationValue (Maybe Text) (Maybe Text) # 
HasField "playerName" ReservationValue (Maybe Text) # 

Methods

getField :: Proxy# Symbol "playerName" -> ReservationValue -> Maybe Text #

ModifyField "unpack" (Dictionary a0) (Dictionary a0) (Map Text a0) (Map Text a0) # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Map Text a0 -> Map Text a0) -> Dictionary a0 -> Dictionary a0 #

setField :: Proxy# Symbol "unpack" -> Dictionary a0 -> Map Text a0 -> Dictionary a0 #

fieldLens :: Functor f => Proxy# Symbol "unpack" -> (Map Text a0 -> f (Map Text a0)) -> Dictionary a0 -> f (Dictionary a0) #

HasField "unpack" (Dictionary a0) (Map Text a0) # 

Methods

getField :: Proxy# Symbol "unpack" -> Dictionary a0 -> Map Text a0 #

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

Methods

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

ModifyRec "content" Text cs0 => HasField "content" (Rec cs0 NameProperty) Text # 

Methods

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

ModifyRec "gameName" Text cs0 => HasField "gameName" (Rec cs0 PrivateMatchSettingsValue) Text # 

Methods

getField :: Proxy# Symbol "gameName" -> Rec cs0 PrivateMatchSettingsValue -> Text #

ModifyRec "key" Text cs0 => HasField "key" (Rec cs0 ByteProperty) Text # 

Methods

getField :: Proxy# Symbol "key" -> Rec cs0 ByteProperty -> Text #

ModifyRec "mutators" Text cs0 => HasField "mutators" (Rec cs0 PrivateMatchSettingsValue) Text # 

Methods

getField :: Proxy# Symbol "mutators" -> Rec cs0 PrivateMatchSettingsValue -> Text #

ModifyRec "name" Text cs0 => HasField "name" (Rec cs0 PlayStationId) Text # 

Methods

getField :: Proxy# Symbol "name" -> Rec cs0 PlayStationId -> Text #

ModifyRec "password" Text cs0 => HasField "password" (Rec cs0 PrivateMatchSettingsValue) Text # 

Methods

getField :: Proxy# Symbol "password" -> Rec cs0 PrivateMatchSettingsValue -> Text #

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

Methods

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

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

Methods

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

ModifyRec "value" Text cs0 => HasField "value" (Rec cs0 ByteProperty) Text # 

Methods

getField :: Proxy# Symbol "value" -> Rec cs0 ByteProperty -> Text #

ModifyRec "playerName" (Maybe Text) cs0 => HasField "playerName" (Rec cs0 ReservationValue) (Maybe Text) # 

Methods

getField :: Proxy# Symbol "playerName" -> Rec cs0 ReservationValue -> Maybe Text #

ModifyRec "unpack" (Map Text a0) cs0 => HasField "unpack" (Rec cs0 (Dictionary a0)) (Map Text a0) # 

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 (Dictionary a0) -> Map Text a0 #

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

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 "content" Text cs0 => ModifyField "content" (Rec cs0 NameProperty) (Rec cs0 NameProperty) Text Text # 

Methods

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

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

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

ModifyRec "gameName" Text cs0 => ModifyField "gameName" (Rec cs0 PrivateMatchSettingsValue) (Rec cs0 PrivateMatchSettingsValue) Text Text # 
ModifyRec "key" Text cs0 => ModifyField "key" (Rec cs0 ByteProperty) (Rec cs0 ByteProperty) Text Text # 

Methods

modifyField :: Proxy# Symbol "key" -> (Text -> Text) -> Rec cs0 ByteProperty -> Rec cs0 ByteProperty #

setField :: Proxy# Symbol "key" -> Rec cs0 ByteProperty -> Text -> Rec cs0 ByteProperty #

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

ModifyRec "mutators" Text cs0 => ModifyField "mutators" (Rec cs0 PrivateMatchSettingsValue) (Rec cs0 PrivateMatchSettingsValue) Text Text # 
ModifyRec "name" Text cs0 => ModifyField "name" (Rec cs0 PlayStationId) (Rec cs0 PlayStationId) Text Text # 

Methods

modifyField :: Proxy# Symbol "name" -> (Text -> Text) -> Rec cs0 PlayStationId -> Rec cs0 PlayStationId #

setField :: Proxy# Symbol "name" -> Rec cs0 PlayStationId -> Text -> Rec cs0 PlayStationId #

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

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

Methods

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

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

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

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

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) #

ModifyRec "value" Text cs0 => ModifyField "value" (Rec cs0 ByteProperty) (Rec cs0 ByteProperty) Text Text # 

Methods

modifyField :: Proxy# Symbol "value" -> (Text -> Text) -> Rec cs0 ByteProperty -> Rec cs0 ByteProperty #

setField :: Proxy# Symbol "value" -> Rec cs0 ByteProperty -> Text -> Rec cs0 ByteProperty #

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

ModifyRec "playerName" (Maybe Text) cs0 => ModifyField "playerName" (Rec cs0 ReservationValue) (Rec cs0 ReservationValue) (Maybe Text) (Maybe Text) # 

Methods

modifyField :: Proxy# Symbol "playerName" -> (Maybe Text -> Maybe Text) -> Rec cs0 ReservationValue -> Rec cs0 ReservationValue #

setField :: Proxy# Symbol "playerName" -> Rec cs0 ReservationValue -> Maybe Text -> Rec cs0 ReservationValue #

fieldLens :: Functor f => Proxy# Symbol "playerName" -> (Maybe Text -> f (Maybe Text)) -> Rec cs0 ReservationValue -> f (Rec cs0 ReservationValue) #

ModifyRec "unpack" (Map Text a0) cs0 => ModifyField "unpack" (Rec cs0 (Dictionary a0)) (Rec cs0 (Dictionary a0)) (Map Text a0) (Map Text a0) # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Map Text a0 -> Map Text a0) -> Rec cs0 (Dictionary a0) -> Rec cs0 (Dictionary a0) #

setField :: Proxy# Symbol "unpack" -> Rec cs0 (Dictionary a0) -> Map Text a0 -> Rec cs0 (Dictionary a0) #

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

type FieldType "unpack" Text Source # 
type FieldType "unpack" Text = Text
type UpdateType "content" StrProperty Text # 
type UpdateType "content" NameProperty Text # 
type UpdateType "gameName" PrivateMatchSettingsValue Text # 
type UpdateType "key" ByteProperty Text # 
type UpdateType "mutators" PrivateMatchSettingsValue Text # 
type UpdateType "name" PlayStationId Text # 
type UpdateType "password" PrivateMatchSettingsValue Text # 
type UpdateType "unpack" Text Text Source # 
type UpdateType "unpack" Text Text = Text
type UpdateType "unpack" StringValue Text # 
type UpdateType "value" ByteProperty Text # 
type UpdateType "playerName" ReservationValue (Maybe Text) # 
type UpdateType "unpack" (Dictionary a0) (Map Text a0) # 
type UpdateType "unpack" (Dictionary a0) (Map Text a0) = Dictionary a0

encodeLatin1 :: Text -> ByteString Source #

Encodes text as Latin-1. Note that this isn't really safe if the text has characters that can't be encoded in Latin-1.