module Buffet.Test.Test
  ( get
  ) where

import qualified Buffet.Parse.ParseInternal as ParseInternal
import qualified Buffet.Test.Configuration as Configuration
import qualified Buffet.Test.TestInternal as TestInternal
import qualified Control.Monad as Monad
import qualified Data.Text as T
import Prelude (Bool, FilePath, IO)

get :: Configuration.Configuration -> FilePath -> IO (Bool, T.Text)
get :: Configuration -> FilePath -> IO (Bool, Text)
get Configuration
configuration = FilePath -> IO Buffet
ParseInternal.get (FilePath -> IO Buffet)
-> (Buffet -> IO (Bool, Text)) -> FilePath -> IO (Bool, Text)
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
Monad.>=> Configuration -> Buffet -> IO (Bool, Text)
TestInternal.get Configuration
configuration