Don't expose Convert
This commit is contained in:
@@ -1,6 +1,6 @@
|
||||
{-# LANGUAGE FlexibleInstances #-}
|
||||
|
||||
module Language.Haskell.GhcMod.Convert where
|
||||
module Language.Haskell.GhcMod.Convert (convert, convert') where
|
||||
|
||||
import Language.Haskell.GhcMod.Monad
|
||||
import Language.Haskell.GhcMod.Types
|
||||
|
||||
@@ -5,10 +5,8 @@ module Language.Haskell.GhcMod.Find where
|
||||
import Data.Function (on)
|
||||
import Data.List (groupBy, sort)
|
||||
import Data.Maybe (fromMaybe)
|
||||
import GHC (Ghc)
|
||||
import qualified GHC as G
|
||||
import Language.Haskell.GhcMod.Browse (browseAll)
|
||||
import Language.Haskell.GhcMod.GHCApi
|
||||
import Language.Haskell.GhcMod.Monad
|
||||
import Language.Haskell.GhcMod.Convert
|
||||
import Language.Haskell.GhcMod.Types
|
||||
@@ -54,3 +52,6 @@ getSymMdlDb = do
|
||||
-- | Looking up 'SymMdlDb' with 'Symbol' to find modules.
|
||||
lookupSym :: Symbol -> SymMdlDb -> [ModuleString]
|
||||
lookupSym sym (SymMdlDb db) = fromMaybe [] (M.lookup sym db)
|
||||
|
||||
lookupSym' :: Options -> Symbol -> SymMdlDb -> String
|
||||
lookupSym' opt sym db = convert opt $ lookupSym sym db
|
||||
|
||||
@@ -14,6 +14,7 @@ module Language.Haskell.GhcMod.Ghc (
|
||||
, SymMdlDb
|
||||
, getSymMdlDb
|
||||
, lookupSym
|
||||
, lookupSym'
|
||||
) where
|
||||
|
||||
import Language.Haskell.GhcMod.Boot
|
||||
|
||||
Reference in New Issue
Block a user