Development.IDE.GHC.Orphans
Contents
Description
Orphan instances for GHC. Note that the NFData instances may not be law abiding.
NFData
Methods
(==) :: SourceModified -> SourceModified -> Bool #
(/=) :: SourceModified -> SourceModified -> Bool #
showsPrec :: Int -> ParsedModule -> ShowS #
show :: ParsedModule -> String #
showList :: [ParsedModule] -> ShowS #
showsPrec :: Int -> CoreModule -> ShowS #
show :: CoreModule -> String #
showList :: [CoreModule] -> ShowS #
showsPrec :: Int -> ModDetails -> ShowS #
show :: ModDetails -> String #
showList :: [ModDetails] -> ShowS #
showsPrec :: Int -> ModGuts -> ShowS #
show :: ModGuts -> String #
showList :: [ModGuts] -> ShowS #
showsPrec :: Int -> CgGuts -> ShowS #
show :: CgGuts -> String #
showList :: [CgGuts] -> ShowS #
showsPrec :: Int -> InteractiveImport -> ShowS #
show :: InteractiveImport -> String #
showList :: [InteractiveImport] -> ShowS #
showsPrec :: Int -> ModSummary -> ShowS #
show :: ModSummary -> String #
showList :: [ModSummary] -> ShowS #
showsPrec :: Int -> SourceModified -> ShowS #
show :: SourceModified -> String #
showList :: [SourceModified] -> ShowS #
showsPrec :: Int -> Linkable -> ShowS #
show :: Linkable -> String #
showList :: [Linkable] -> ShowS #
showsPrec :: Int -> HieFile -> ShowS #
show :: HieFile -> String #
showList :: [HieFile] -> ShowS #
showsPrec :: Int -> PackageFlag -> ShowS #
show :: PackageFlag -> String #
showList :: [PackageFlag] -> ShowS #
showsPrec :: Int -> SourcePackageId -> ShowS #
show :: SourcePackageId -> String #
showList :: [SourcePackageId] -> ShowS #
showsPrec :: Int -> PackageName -> ShowS #
show :: PackageName -> String #
showList :: [PackageName] -> ShowS #
showsPrec :: Int -> Module -> ShowS #
show :: Module -> String #
showList :: [Module] -> ShowS #
showsPrec :: Int -> ModuleName -> ShowS #
show :: ModuleName -> String #
showList :: [ModuleName] -> ShowS #
showsPrec :: Int -> InstalledUnitId -> ShowS #
show :: InstalledUnitId -> String #
showList :: [InstalledUnitId] -> ShowS #
showsPrec :: Int -> ComponentId -> ShowS #
show :: ComponentId -> String #
showList :: [ComponentId] -> ShowS #
showsPrec :: Int -> OccName -> ShowS #
show :: OccName -> String #
showList :: [OccName] -> ShowS #
hashWithSalt :: Int -> ModuleName -> Int #
hash :: ModuleName -> Int #
hashWithSalt :: Int -> InstalledUnitId -> Int #
hash :: InstalledUnitId -> Int #
hashWithSalt :: Int -> OccName -> Int #
hash :: OccName -> Int #
toJSON :: RealSrcSpan -> Value #
toEncoding :: RealSrcSpan -> Encoding #
toJSONList :: [RealSrcSpan] -> Value #
toEncodingList :: [RealSrcSpan] -> Encoding #
parseJSON :: Value -> Parser RealSrcSpan #
parseJSONList :: Value -> Parser [RealSrcSpan] #
rnf :: ParsedModule -> () #
rnf :: CoreModule -> () #
rnf :: ModDetails -> () #
rnf :: ModGuts -> () #
rnf :: CgGuts -> () #
rnf :: ModSummary -> () #
rnf :: SourceModified -> () #
rnf :: Linkable -> () #
rnf :: HieFile -> () #
rnf :: HsDocString -> () #
rnf :: Type -> () #
rnf :: SafeHaskellMode -> () #
rnf :: RealSrcSpan -> () #
rnf :: InstalledUnitId -> () #
rnf :: StringBuffer -> () #
showsPrec :: Int -> Bag a -> ShowS #
show :: Bag a -> String #
showList :: [Bag a] -> ShowS #
showsPrec :: Int -> Annotated ParsedSource -> ShowS #
show :: Annotated ParsedSource -> String #
showList :: [Annotated ParsedSource] -> ShowS #
rnf :: HsModule a -> () #
rnf :: IdentifierDetails a -> () #
rnf :: ImportDecl GhcPs -> () #
rnf :: Annotated ParsedSource -> () #
showsPrec :: Int -> GenLocated SrcSpan a -> ShowS #
show :: GenLocated SrcSpan a -> String #
showList :: [GenLocated SrcSpan a] -> ShowS #
rnf :: GenLocated l e -> () #