{-# LANGUAGE ScopedTypeVariables #-}

module Hoogle.Cabal (main) where

import Hoogle.Cabal.Command (executeCommand)
import Hoogle.Cabal.Logger (stdoutLogger)

main :: IO ()
main :: IO ()
main = Logger Log -> IO ()
executeCommand Logger Log
forall msg. Show msg => Logger msg
stdoutLogger