octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Value.IntValue

Documentation

newtype IntValue Source #

Constructors

IntValue 

Instances

Eq IntValue Source # 
Show IntValue Source # 
Generic IntValue Source # 

Associated Types

type Rep IntValue :: * -> * #

Methods

from :: IntValue -> Rep IntValue x #

to :: Rep IntValue x -> IntValue #

NFData IntValue Source # 

Methods

rnf :: IntValue -> () #

ToJSON IntValue Source # 

Methods

toJSON :: IntValue -> Value

toEncoding :: IntValue -> Encoding

toJSONList :: [IntValue] -> Value

toEncodingList :: [IntValue] -> Encoding

HasField "unpack" IntValue Int32 Source # 

Methods

getField :: Proxy# Symbol "unpack" -> IntValue -> Int32

ModifyField "unpack" IntValue IntValue Int32 Int32 Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Int32 -> Int32) -> IntValue -> IntValue

setField :: Proxy# Symbol "unpack" -> IntValue -> Int32 -> IntValue

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

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

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 IntValue -> Int32

ModifyRec "unpack" Int32 cs0 => ModifyField "unpack" (Rec cs0 IntValue) (Rec cs0 IntValue) Int32 Int32 Source # 

Methods

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

setField :: Proxy# Symbol "unpack" -> Rec cs0 IntValue -> Int32 -> Rec cs0 IntValue

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

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