octane-0.15.0: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.RemoteId

Synopsis

Documentation

data RemoteId Source #

A player's canonical remote ID. This is the best way to uniquely identify players

Instances

Eq RemoteId Source # 
Show RemoteId Source # 
Generic RemoteId Source # 

Associated Types

type Rep RemoteId :: * -> * #

Methods

from :: RemoteId -> Rep RemoteId x #

to :: Rep RemoteId x -> RemoteId #

ToJSON RemoteId Source #

Encodes the remote ID as an object with Type and Value keys.

NFData RemoteId Source # 

Methods

rnf :: RemoteId -> () #

HasField "remoteId" UniqueIdValue RemoteId # 

Methods

getField :: Proxy# Symbol "remoteId" -> UniqueIdValue -> RemoteId #

HasField "remoteId" ReservationValue RemoteId # 

Methods

getField :: Proxy# Symbol "remoteId" -> ReservationValue -> RemoteId #

ModifyField "remoteId" UniqueIdValue UniqueIdValue RemoteId RemoteId # 
ModifyField "remoteId" ReservationValue ReservationValue RemoteId RemoteId # 
ModifyRec "remoteId" RemoteId cs0 => HasField "remoteId" (Rec cs0 UniqueIdValue) RemoteId # 

Methods

getField :: Proxy# Symbol "remoteId" -> Rec cs0 UniqueIdValue -> RemoteId #

ModifyRec "remoteId" RemoteId cs0 => HasField "remoteId" (Rec cs0 ReservationValue) RemoteId # 

Methods

getField :: Proxy# Symbol "remoteId" -> Rec cs0 ReservationValue -> RemoteId #

ModifyRec "remoteId" RemoteId cs0 => ModifyField "remoteId" (Rec cs0 UniqueIdValue) (Rec cs0 UniqueIdValue) RemoteId RemoteId # 

Methods

modifyField :: Proxy# Symbol "remoteId" -> (RemoteId -> RemoteId) -> Rec cs0 UniqueIdValue -> Rec cs0 UniqueIdValue #

setField :: Proxy# Symbol "remoteId" -> Rec cs0 UniqueIdValue -> RemoteId -> Rec cs0 UniqueIdValue #

fieldLens :: Functor f => Proxy# Symbol "remoteId" -> (RemoteId -> f RemoteId) -> Rec cs0 UniqueIdValue -> f (Rec cs0 UniqueIdValue) #

ModifyRec "remoteId" RemoteId cs0 => ModifyField "remoteId" (Rec cs0 ReservationValue) (Rec cs0 ReservationValue) RemoteId RemoteId # 
type Rep RemoteId Source # 
type UpdateType "remoteId" UniqueIdValue RemoteId # 
type UpdateType "remoteId" ReservationValue RemoteId # 

newtype SteamId Source #

Constructors

SteamId 

Instances

Eq SteamId Source # 

Methods

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

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

Show SteamId Source # 
Generic SteamId Source # 

Associated Types

type Rep SteamId :: * -> * #

Methods

from :: SteamId -> Rep SteamId x #

to :: Rep SteamId x -> SteamId #

ToJSON SteamId Source #

Encoded directly as a number.

BinaryBit SteamId Source #

Stored as a plain Word64.

Methods

putBits :: Int -> SteamId -> BitPut () #

getBits :: Int -> BitGet SteamId #

NFData SteamId Source # 

Methods

rnf :: SteamId -> () #

HasField "unpack" SteamId Word64 Source # 

Methods

getField :: Proxy# Symbol "unpack" -> SteamId -> Word64 #

ModifyField "unpack" SteamId SteamId Word64 Word64 Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Word64 -> Word64) -> SteamId -> SteamId #

setField :: Proxy# Symbol "unpack" -> SteamId -> Word64 -> SteamId #

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

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

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 SteamId -> Word64 #

ModifyRec "unpack" Word64 cs0 => ModifyField "unpack" (Rec cs0 SteamId) (Rec cs0 SteamId) Word64 Word64 Source # 

Methods

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

setField :: Proxy# Symbol "unpack" -> Rec cs0 SteamId -> Word64 -> Rec cs0 SteamId #

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

type Rep SteamId Source # 
type Rep SteamId = D1 (MetaData "SteamId" "Octane.Type.RemoteId" "octane-0.15.0-4F9EHXv8Fsx4ap3JJhWldo" True) (C1 (MetaCons "SteamId" PrefixI True) (S1 (MetaSel (Just Symbol "steamIdUnpack") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word64)))
type FieldType "unpack" SteamId Source # 
type FieldType "unpack" SteamId = Word64
type UpdateType "unpack" SteamId Word64 Source # 

data PlayStationId Source #

Instances

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

Associated Types

type Rep PlayStationId :: * -> * #

ToJSON PlayStationId Source # 
BinaryBit PlayStationId Source #

Each part is stored as exactly 16 bits.

NFData PlayStationId Source # 

Methods

rnf :: 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 # 
type Rep PlayStationId Source # 
type Rep PlayStationId = D1 (MetaData "PlayStationId" "Octane.Type.RemoteId" "octane-0.15.0-4F9EHXv8Fsx4ap3JJhWldo" 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 "unknown" PlayStationId Source # 
type UpdateType "name" PlayStationId Text Source # 
type UpdateType "unknown" PlayStationId ByteString Source # 

newtype SplitscreenId Source #

Constructors

SplitscreenId 

Instances

Eq SplitscreenId Source # 
Show SplitscreenId Source # 
Generic SplitscreenId Source # 

Associated Types

type Rep SplitscreenId :: * -> * #

ToJSON SplitscreenId Source #

Encoded as an optional number.

BinaryBit SplitscreenId Source #

Stored as a bare byte string.

NFData SplitscreenId Source # 

Methods

rnf :: SplitscreenId -> () #

ModifyField "unpack" SplitscreenId SplitscreenId (Maybe Int) (Maybe Int) Source # 
HasField "unpack" SplitscreenId (Maybe Int) Source # 

Methods

getField :: Proxy# Symbol "unpack" -> SplitscreenId -> Maybe Int #

ModifyRec "unpack" (Maybe Int) cs0 => HasField "unpack" (Rec cs0 SplitscreenId) (Maybe Int) Source # 

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 SplitscreenId -> Maybe Int #

ModifyRec "unpack" (Maybe Int) cs0 => ModifyField "unpack" (Rec cs0 SplitscreenId) (Rec cs0 SplitscreenId) (Maybe Int) (Maybe Int) Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Maybe Int -> Maybe Int) -> Rec cs0 SplitscreenId -> Rec cs0 SplitscreenId #

setField :: Proxy# Symbol "unpack" -> Rec cs0 SplitscreenId -> Maybe Int -> Rec cs0 SplitscreenId #

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

type Rep SplitscreenId Source # 
type Rep SplitscreenId = D1 (MetaData "SplitscreenId" "Octane.Type.RemoteId" "octane-0.15.0-4F9EHXv8Fsx4ap3JJhWldo" True) (C1 (MetaCons "SplitscreenId" PrefixI True) (S1 (MetaSel (Just Symbol "splitscreenIdUnpack") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Int))))
type FieldType "unpack" SplitscreenId Source # 
type UpdateType "unpack" SplitscreenId (Maybe Int) Source # 

newtype XboxId Source #

Constructors

XboxId 

Fields

Instances

Eq XboxId Source # 

Methods

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

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

Show XboxId Source # 
Generic XboxId Source # 

Associated Types

type Rep XboxId :: * -> * #

Methods

from :: XboxId -> Rep XboxId x #

to :: Rep XboxId x -> XboxId #

ToJSON XboxId Source #

Encoded directly as a number.

BinaryBit XboxId Source #

Stored as a plain Word64.

Methods

putBits :: Int -> XboxId -> BitPut () #

getBits :: Int -> BitGet XboxId #

NFData XboxId Source # 

Methods

rnf :: XboxId -> () #

HasField "unpack" XboxId Word64 Source # 

Methods

getField :: Proxy# Symbol "unpack" -> XboxId -> Word64 #

ModifyField "unpack" XboxId XboxId Word64 Word64 Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Word64 -> Word64) -> XboxId -> XboxId #

setField :: Proxy# Symbol "unpack" -> XboxId -> Word64 -> XboxId #

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

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

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 XboxId -> Word64 #

ModifyRec "unpack" Word64 cs0 => ModifyField "unpack" (Rec cs0 XboxId) (Rec cs0 XboxId) Word64 Word64 Source # 

Methods

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

setField :: Proxy# Symbol "unpack" -> Rec cs0 XboxId -> Word64 -> Rec cs0 XboxId #

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

type Rep XboxId Source # 
type Rep XboxId = D1 (MetaData "XboxId" "Octane.Type.RemoteId" "octane-0.15.0-4F9EHXv8Fsx4ap3JJhWldo" True) (C1 (MetaCons "XboxId" PrefixI True) (S1 (MetaSel (Just Symbol "xboxIdUnpack") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word64)))
type FieldType "unpack" XboxId Source # 
type FieldType "unpack" XboxId = Word64
type UpdateType "unpack" XboxId Word64 Source # 
type UpdateType "unpack" XboxId Word64 = XboxId