Safe Haskell | None |
---|---|
Language | Haskell2010 |
- kExperimentConnection :: Word32
- kAgentConnection :: Word32
- kEnvironmentConnection :: Word32
- kAgentInit :: Word32
- kAgentStart :: Word32
- kAgentStep :: Word32
- kAgentEnd :: Word32
- kAgentCleanup :: Word32
- kAgentMessage :: Word32
- kEnvInit :: Word32
- kEnvStart :: Word32
- kEnvStep :: Word32
- kEnvCleanup :: Word32
- kEnvMessage :: Word32
- kRLInit :: Word32
- kRLStart :: Word32
- kRLStep :: Word32
- kRLCleanup :: Word32
- kRLReturn :: Word32
- kRLNumSteps :: Word32
- kRLNumEpisodes :: Word32
- kRLEpisode :: Word32
- kRLAgentMessage :: Word32
- kRLEnvMessage :: Word32
- kRLTerm :: Word32
- kLocalHost :: [Char]
- kDefaultPort :: [Char]
- kRetryTimeout :: Integer
- kDefaultBufferSize :: Integer
- kIntSize :: Int
- kDoubleSize :: Int
- kCharSize :: Int
- data RLAbstractType = RLAbstractType [Int] [Double] ByteString
- newtype Action = Action RLAbstractType
- newtype Observation = Observation RLAbstractType
- type Reward = Double
- type Terminal = Int
- sizeOfObs :: Observation -> Int
- sizeOfAction :: Action -> Int
- sizeOfRewardObs :: (Terminal, Reward, Observation) -> Int
- getObservation :: Socket -> MaybeT IO Observation
- getObservationOrDie :: Socket -> IO Observation
- getAction :: Socket -> MaybeT IO Action
- getRewardOrDie :: Socket -> IO Reward
- getRewardObservation :: Socket -> MaybeT IO (Reward, Observation)
- getRewardObservationOrDie :: Socket -> IO (Reward, Observation)
- getInt :: Socket -> MaybeT IO Int
- getDouble :: Socket -> MaybeT IO Double
- getString :: Socket -> MaybeT IO ByteString
- getStringOrDie :: String -> Socket -> IO ByteString
- putObservation :: Observation -> Put
- putAction :: Action -> Put
- putTerminalRewardObs :: (Terminal, Reward, Observation) -> Put
- putString :: ByteString -> Put
- glueConnect :: forall r. ((Socket, SockAddr) -> IO r) -> IO r
- doCallWithNoParams :: Socket -> Word32 -> IO ()
- confirmState :: Socket -> Word32 -> IO ()
- sendAgentMessage :: Socket -> ByteString -> IO ByteString
- sendAgentMessageStr :: Socket -> String -> IO ByteString
- sendEnvMessage :: Socket -> ByteString -> IO ByteString
- sendEnvMessageStr :: Socket -> String -> IO ByteString
Magic numbers
Connection types
Agent
Environment
Experiment
Other
Other constants
kLocalHost :: [Char] Source
kDefaultPort :: [Char] Source
kDoubleSize :: Int Source
Data types
sizeOf functions
sizeOfObs :: Observation -> Int Source
sizeOfAction :: Action -> Int Source
sizeOfRewardObs :: (Terminal, Reward, Observation) -> Int Source
Get network objects
getRewardOrDie :: Socket -> IO Reward Source
getRewardObservation :: Socket -> MaybeT IO (Reward, Observation) Source
getRewardObservationOrDie :: Socket -> IO (Reward, Observation) Source
getStringOrDie :: String -> Socket -> IO ByteString Source
Put network objects
putObservation :: Observation -> Put Source
putTerminalRewardObs :: (Terminal, Reward, Observation) -> Put Source
putString :: ByteString -> Put Source
Network functions
doCallWithNoParams :: Socket -> Word32 -> IO () Source
confirmState :: Socket -> Word32 -> IO () Source
sendAgentMessage :: Socket -> ByteString -> IO ByteString Source
sendAgentMessageStr :: Socket -> String -> IO ByteString Source
sendEnvMessage :: Socket -> ByteString -> IO ByteString Source
sendEnvMessageStr :: Socket -> String -> IO ByteString Source