module Hoogle.Type.Item where
import General.Base
import General.Util
import Hoogle.Store.All
import Hoogle.Type.Docs
import Hoogle.Type.TagStr
import Hoogle.Type.TypeSig
import Data.Generics.Uniplate
type Input = ([Fact], [TextItem])
data TextItem = TextItem
{itemLevel :: Int
,itemKey :: String
,itemName :: String
,itemType :: Maybe TypeSig
,itemDisp :: TagStr
,itemURL :: URL
,itemDocs :: String
,itemPriority :: Int
}
deriving Show
data Fact
= FactAlias TypeSig TypeSig
| FactInstance TypeSig
| FactDataKind String Int
| FactClassKind String Int
| FactCtorType String String
deriving Show
data Entry = Entry
{entryLocations :: [(URL, [Once Entry])]
,entryName :: String
,entryText :: TagStr
,entryDocs :: Docs
,entryPriority :: Int
,entryKey :: String
,entryType :: Maybe TypeSig
}
deriving Typeable
entryUnique Entry{..} = (entryName, entryText, entryDocs, entryKey, entryType)
entryJoin e1 e2 = e1
{entryPriority = min (entryPriority e1) (entryPriority e2)
,entryLocations = nubOn (map (entryName . fromOnce) . snd) $ concatMap entryLocations $
if entryScore e1 < entryScore e2 then [e1,e2] else [e2,e1]}
entryURL e = head $ map fst (entryLocations e) ++ [""]
data EntryView = FocusOn String
| ArgPosNum Int Int
deriving Show
renderEntryText :: [EntryView] -> TagStr -> TagStr
renderEntryText view = transform f
where
cols = [(b+1,a+1) | ArgPosNum a b <- view]
strs = [map toLower x | FocusOn x <- view]
f (TagColor i x) = maybe x (`TagColor` x) $ lookup i $ [(0,0)|cols/=[]] ++ cols
f (TagBold (Str xs)) = TagBold $ Tags $ g xs
f x = x
g xs | ss /= [] = TagEmph (Str a) : g b
where ss = filter (`isPrefixOf` map toLower xs) strs
(a,b) = splitAt (maximum $ map length ss) xs
g (x:xs) = Str [x] : g xs
g [] = []
data EntryScore = EntryScore Int String String
deriving (Eq,Ord)
entryScore :: Entry -> EntryScore
entryScore e = EntryScore (entryPriority e) (map toLower $ entryName e) (entryName e)
instance Show Entry where
show = showTagText . entryText
instance Store Entry where
put (Entry a b c d e f g) = put7 a b c d e f g
get = get7 Entry