octane-0.16.2: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Stream

Synopsis

Documentation

newtype Stream Source #

A stream of bits.

Constructors

Stream 

Instances

Eq Stream Source # 

Methods

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

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

Show Stream Source #

Doesn't show the actual bytes to avoid dumping tons of text.

Generic Stream Source # 

Associated Types

type Rep Stream :: * -> * #

Methods

from :: Stream -> Rep Stream x #

to :: Rep Stream x -> Stream #

Binary Stream Source #

Prefixed by a length in bytes. Each byte is reversed such that 0b01234567 is actually 0b76543210.

Methods

put :: Stream -> Put #

get :: Get Stream #

putList :: [Stream] -> Put #

NFData Stream Source # 

Methods

rnf :: Stream -> () #

HasField "stream" ReplayWithoutFrames Stream # 
HasField "unpack" Stream ByteString Source # 

Methods

getField :: Proxy# Symbol "unpack" -> Stream -> ByteString #

ModifyField "stream" ReplayWithoutFrames ReplayWithoutFrames Stream Stream # 
ModifyField "unpack" Stream Stream ByteString ByteString Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (ByteString -> ByteString) -> Stream -> Stream #

setField :: Proxy# Symbol "unpack" -> Stream -> ByteString -> Stream #

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

ModifyRec "stream" Stream cs0 => HasField "stream" (Rec cs0 ReplayWithoutFrames) Stream # 

Methods

getField :: Proxy# Symbol "stream" -> Rec cs0 ReplayWithoutFrames -> Stream #

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

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 Stream -> ByteString #

ModifyRec "stream" Stream cs0 => ModifyField "stream" (Rec cs0 ReplayWithoutFrames) (Rec cs0 ReplayWithoutFrames) Stream Stream # 
ModifyRec "unpack" ByteString cs0 => ModifyField "unpack" (Rec cs0 Stream) (Rec cs0 Stream) ByteString ByteString Source # 

Methods

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

setField :: Proxy# Symbol "unpack" -> Rec cs0 Stream -> ByteString -> Rec cs0 Stream #

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

type Rep Stream Source # 
type Rep Stream = D1 (MetaData "Stream" "Octane.Type.Stream" "octane-0.16.2-723rhEOjs3bpY6wlibC9r" True) (C1 (MetaCons "Stream" PrefixI True) (S1 (MetaSel (Just Symbol "streamUnpack") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))
type FieldType "unpack" Stream Source # 
type FieldType "unpack" Stream = ByteString
type UpdateType "stream" ReplayWithoutFrames Stream # 
type UpdateType "unpack" Stream ByteString Source #