octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Value.LocationValue

Documentation

newtype LocationValue Source #

Instances

Eq LocationValue Source # 
Show LocationValue Source # 
Generic LocationValue Source # 

Associated Types

type Rep LocationValue :: * -> * #

NFData LocationValue Source # 

Methods

rnf :: LocationValue -> () #

ToJSON LocationValue Source # 

Methods

toJSON :: LocationValue -> Value

toEncoding :: LocationValue -> Encoding

toJSONList :: [LocationValue] -> Value

toEncodingList :: [LocationValue] -> Encoding

ModifyField "unpack" LocationValue LocationValue (Vector Int) (Vector Int) Source # 
HasField "unpack" LocationValue (Vector Int) Source # 

Methods

getField :: Proxy# Symbol "unpack" -> LocationValue -> Vector Int

ModifyRec "unpack" (Vector Int) cs0 => HasField "unpack" (Rec cs0 LocationValue) (Vector Int) Source # 

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 LocationValue -> Vector Int

ModifyRec "unpack" (Vector Int) cs0 => ModifyField "unpack" (Rec cs0 LocationValue) (Rec cs0 LocationValue) (Vector Int) (Vector Int) Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Vector Int -> Vector Int) -> Rec cs0 LocationValue -> Rec cs0 LocationValue

setField :: Proxy# Symbol "unpack" -> Rec cs0 LocationValue -> Vector Int -> Rec cs0 LocationValue

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

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