module NvFetcher.Utils where import Data.Binary import qualified Data.ByteString as BS import qualified Data.ByteString.Lazy as LBS import Data.Text (Text) import qualified Data.Text as T import Development.Shake encode' :: Binary a => a -> BS.ByteString encode' :: a -> ByteString encode' = [ByteString] -> ByteString BS.concat ([ByteString] -> ByteString) -> (a -> [ByteString]) -> a -> ByteString forall b c a. (b -> c) -> (a -> b) -> a -> c . ByteString -> [ByteString] LBS.toChunks (ByteString -> [ByteString]) -> (a -> ByteString) -> a -> [ByteString] forall b c a. (b -> c) -> (a -> b) -> a -> c . a -> ByteString forall a. Binary a => a -> ByteString encode decode' :: Binary a => BS.ByteString -> a decode' :: ByteString -> a decode' = ByteString -> a forall a. Binary a => ByteString -> a decode (ByteString -> a) -> (ByteString -> ByteString) -> ByteString -> a forall b c a. (b -> c) -> (a -> b) -> a -> c . [ByteString] -> ByteString LBS.fromChunks ([ByteString] -> ByteString) -> (ByteString -> [ByteString]) -> ByteString -> ByteString forall b c a. (b -> c) -> (a -> b) -> a -> c . ByteString -> [ByteString] forall (f :: * -> *) a. Applicative f => a -> f a pure asString :: Text -> Text asString :: Text -> Text asString = String -> Text T.pack (String -> Text) -> (Text -> String) -> Text -> Text forall b c a. (b -> c) -> (a -> b) -> a -> c . Text -> String forall a. Show a => a -> String show getShakeDir :: Action FilePath getShakeDir :: Action String getShakeDir = ShakeOptions -> String shakeFiles (ShakeOptions -> String) -> Action ShakeOptions -> Action String forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b <$> Action ShakeOptions getShakeOptions