Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Orphan instances
StringLike Text Source # | |
toString :: Text -> String Source # lines :: ListLike full Text => Text -> full Source # words :: ListLike full Text => Text -> full Source # unlines :: ListLike full Text => full -> Text Source # unwords :: ListLike full Text => full -> Text Source # show :: Show a => a -> Text Source # fromStringLike :: StringLike s' => Text -> s' Source # fromText :: Text -> Text Source # fromLazyText :: Text0 -> Text Source # | |
ListLike Text Char Source # | |
singleton :: Char -> Text Source # cons :: Char -> Text -> Text Source # snoc :: Text -> Char -> Text Source # append :: Text -> Text -> Text Source # uncons :: Text -> Maybe (Char, Text) Source # length :: Text -> Int Source # map :: ListLike full' item' => (Char -> item') -> Text -> full' Source # rigidMap :: (Char -> Char) -> Text -> Text Source # reverse :: Text -> Text Source # intersperse :: Char -> Text -> Text Source # concat :: ListLike full' Text => full' -> Text Source # concatMap :: ListLike full' item' => (Char -> full') -> Text -> full' Source # rigidConcatMap :: (Char -> Text) -> Text -> Text Source # any :: (Char -> Bool) -> Text -> Bool Source # all :: (Char -> Bool) -> Text -> Bool Source # maximum :: Text -> Char Source # minimum :: Text -> Char Source # replicate :: Int -> Char -> Text Source # take :: Int -> Text -> Text Source # drop :: Int -> Text -> Text Source # splitAt :: Int -> Text -> (Text, Text) Source # takeWhile :: (Char -> Bool) -> Text -> Text Source # dropWhile :: (Char -> Bool) -> Text -> Text Source # dropWhileEnd :: (Char -> Bool) -> Text -> Text Source # span :: (Char -> Bool) -> Text -> (Text, Text) Source # break :: (Char -> Bool) -> Text -> (Text, Text) Source # group :: (ListLike full' Text, Eq Char) => Text -> full' Source # inits :: ListLike full' Text => Text -> full' Source # tails :: ListLike full' Text => Text -> full' Source # isPrefixOf :: Text -> Text -> Bool Source # isSuffixOf :: Text -> Text -> Bool Source # isInfixOf :: Text -> Text -> Bool Source # stripPrefix :: Text -> Text -> Maybe Text Source # stripSuffix :: Text -> Text -> Maybe Text Source # elem :: Char -> Text -> Bool Source # notElem :: Char -> Text -> Bool Source # find :: (Char -> Bool) -> Text -> Maybe Char Source # filter :: (Char -> Bool) -> Text -> Text Source # partition :: (Char -> Bool) -> Text -> (Text, Text) Source # index :: Text -> Int -> Char Source # elemIndex :: Char -> Text -> Maybe Int Source # elemIndices :: (Eq Char, ListLike result Int) => Char -> Text -> result Source # findIndex :: (Char -> Bool) -> Text -> Maybe Int Source # findIndices :: ListLike result Int => (Char -> Bool) -> Text -> result Source # sequence :: (Applicative m, ListLike fullinp (m Char)) => fullinp -> m Text Source # mapM :: (Applicative m, ListLike full' item') => (Char -> m item') -> Text -> m full' Source # rigidMapM :: Monad m => (Char -> m Char) -> Text -> m Text Source # delete :: Char -> Text -> Text Source # deleteFirsts :: Text -> Text -> Text Source # union :: Text -> Text -> Text Source # intersect :: Text -> Text -> Text Source # insert :: Char -> Text -> Text Source # toList' :: Text -> [Char] Source # fromList' :: [Char] -> Text Source # fromListLike :: ListLike full' Char => Text -> full' Source # nubBy :: (Char -> Char -> Bool) -> Text -> Text Source # deleteBy :: (Char -> Char -> Bool) -> Char -> Text -> Text Source # deleteFirstsBy :: (Char -> Char -> Bool) -> Text -> Text -> Text Source # unionBy :: (Char -> Char -> Bool) -> Text -> Text -> Text Source # intersectBy :: (Char -> Char -> Bool) -> Text -> Text -> Text Source # groupBy :: (ListLike full' Text, Eq Char) => (Char -> Char -> Bool) -> Text -> full' Source # sortBy :: (Char -> Char -> Ordering) -> Text -> Text Source # insertBy :: (Char -> Char -> Ordering) -> Char -> Text -> Text Source # genericLength :: Num a => Text -> a Source # genericTake :: Integral a => a -> Text -> Text Source # genericDrop :: Integral a => a -> Text -> Text Source # genericSplitAt :: Integral a => a -> Text -> (Text, Text) Source # genericReplicate :: Integral a => a -> Char -> Text Source # | |
FoldableLL Text Char Source # | |
ListLikeIO Text Char Source # | |
hGetLine :: Handle -> IO Text Source # hGetContents :: Handle -> IO Text Source # hGet :: Handle -> Int -> IO Text Source # hGetNonBlocking :: Handle -> Int -> IO Text Source # hPutStr :: Handle -> Text -> IO () Source # hPutStrLn :: Handle -> Text -> IO () Source # getContents :: IO Text Source # putStr :: Text -> IO () Source # putStrLn :: Text -> IO () Source # interact :: (Text -> Text) -> IO () Source # readFile :: FilePath -> IO Text Source # writeFile :: FilePath -> Text -> IO () Source # appendFile :: FilePath -> Text -> IO () Source # |