octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.RemoteId.PlayStationId

Documentation

data PlayStationId Source #

Instances

Eq PlayStationId Source # 
Show PlayStationId Source # 
Generic PlayStationId Source # 

Associated Types

type Rep PlayStationId :: * -> * #

NFData PlayStationId Source # 

Methods

rnf :: PlayStationId -> () #

ToJSON PlayStationId Source # 

Methods

toJSON :: PlayStationId -> Value

toEncoding :: PlayStationId -> Encoding

toJSONList :: [PlayStationId] -> Value

toEncodingList :: [PlayStationId] -> Encoding

BinaryBit PlayStationId Source #

Each part is stored as exactly 16 bits.

Methods

putBits :: Int -> PlayStationId -> BitPut ()

getBits :: Int -> BitGet PlayStationId

HasField "name" PlayStationId Text Source # 

Methods

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

HasField "unknown" PlayStationId ByteString Source # 

Methods

getField :: Proxy# Symbol "unknown" -> PlayStationId -> ByteString

ModifyField "name" PlayStationId PlayStationId Text Text Source # 
ModifyField "unknown" PlayStationId PlayStationId ByteString ByteString Source # 
ModifyRec "name" Text cs0 => HasField "name" (Rec cs0 PlayStationId) Text Source # 

Methods

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

ModifyRec "unknown" ByteString cs0 => HasField "unknown" (Rec cs0 PlayStationId) ByteString Source # 

Methods

getField :: Proxy# Symbol "unknown" -> Rec cs0 PlayStationId -> ByteString

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

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 "unknown" ByteString cs0 => ModifyField "unknown" (Rec cs0 PlayStationId) (Rec cs0 PlayStationId) ByteString ByteString Source # 

Methods

modifyField :: Proxy# Symbol "unknown" -> (ByteString -> ByteString) -> Rec cs0 PlayStationId -> Rec cs0 PlayStationId

setField :: Proxy# Symbol "unknown" -> Rec cs0 PlayStationId -> ByteString -> Rec cs0 PlayStationId

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

type Rep PlayStationId Source # 
type Rep PlayStationId = D1 (MetaData "PlayStationId" "Octane.Type.RemoteId.PlayStationId" "octane-0.16.1-GutvkXgevkCABZiWZysr0h" False) (C1 (MetaCons "PlayStationId" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "playStationIdName") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "playStationIdUnknown") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ByteString))))
type FieldType "name" PlayStationId Source # 
type FieldType "name" PlayStationId = Text
type FieldType "unknown" PlayStationId Source # 
type FieldType "unknown" PlayStationId = ByteString
type UpdateType "name" PlayStationId Text Source # 
type UpdateType "name" PlayStationId Text = PlayStationId
type UpdateType "unknown" PlayStationId ByteString Source # 
type UpdateType "unknown" PlayStationId ByteString = PlayStationId