mirror of
https://github.com/facebook/Haxl.git
synced 2024-12-23 16:53:02 +03:00
b0a5f7b8a8
Summary: Resolve #62 Closes https://github.com/facebook/Haxl/pull/63 Reviewed By: JonCoens Differential Revision: D4299180 Pulled By: niteria fbshipit-source-id: 0bcbefd26184d1e7ad5de99a806ce0cf4b57d1a6
79 lines
1.9 KiB
Haskell
79 lines
1.9 KiB
Haskell
{-# LANGUAGE DeriveDataTypeable #-}
|
|
{-# LANGUAGE GADTs #-}
|
|
{-# LANGUAGE MultiParamTypeClasses #-}
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
{-# LANGUAGE StandaloneDeriving #-}
|
|
{-# LANGUAGE TypeFamilies #-}
|
|
{-# LANGUAGE TypeSynonymInstances #-}
|
|
{-# LANGUAGE FlexibleInstances #-}
|
|
|
|
module MockTAO (
|
|
Id(..),
|
|
initGlobalState,
|
|
assocRangeId2s,
|
|
friendsAssoc,
|
|
friendsOf,
|
|
) where
|
|
|
|
import Data.Hashable
|
|
import Data.Map (Map)
|
|
import Data.Typeable
|
|
import Prelude ()
|
|
import qualified Data.Map as Map
|
|
import qualified Data.Text as Text
|
|
|
|
import Haxl.Prelude
|
|
import Haxl.Core
|
|
|
|
import TestTypes
|
|
|
|
-- -----------------------------------------------------------------------------
|
|
-- Minimal mock TAO
|
|
|
|
data TAOReq a where
|
|
AssocRangeId2s :: Id -> Id -> TAOReq [Id]
|
|
deriving Typeable
|
|
|
|
deriving instance Show (TAOReq a)
|
|
deriving instance Eq (TAOReq a)
|
|
|
|
instance ShowP TAOReq where showp = show
|
|
|
|
instance Hashable (TAOReq a) where
|
|
hashWithSalt s (AssocRangeId2s a b) = hashWithSalt s (a,b)
|
|
|
|
instance StateKey TAOReq where
|
|
data State TAOReq = TAOState {}
|
|
|
|
instance DataSourceName TAOReq where
|
|
dataSourceName _ = "MockTAO"
|
|
|
|
instance DataSource UserEnv TAOReq where
|
|
fetch _state _flags _user bfs = SyncFetch $ mapM_ doFetch bfs
|
|
|
|
initGlobalState :: IO (State TAOReq)
|
|
initGlobalState = return TAOState {}
|
|
|
|
doFetch :: BlockedFetch TAOReq -> IO ()
|
|
doFetch (BlockedFetch req@(AssocRangeId2s a b) r) =
|
|
case Map.lookup (a, b) assocs of
|
|
Nothing -> putFailure r . NotFound . Text.pack $ show req
|
|
Just result -> putSuccess r result
|
|
|
|
assocs :: Map (Id,Id) [Id]
|
|
assocs = Map.fromList [
|
|
((friendsAssoc, 1), [5..10]),
|
|
((friendsAssoc, 2), [7..12]),
|
|
((friendsAssoc, 3), [10..15]),
|
|
((friendsAssoc, 4), [15..19])
|
|
]
|
|
|
|
friendsAssoc :: Id
|
|
friendsAssoc = 167367433327742
|
|
|
|
assocRangeId2s :: Id -> Id -> Haxl [Id]
|
|
assocRangeId2s a b = dataFetch (AssocRangeId2s a b)
|
|
|
|
friendsOf :: Id -> Haxl [Id]
|
|
friendsOf = assocRangeId2s friendsAssoc
|