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