module Streamly.Internal.Data.Maybe.Strict
( Maybe' (..)
, toMaybe
, isJust'
, fromJust'
)
where
data Maybe' a = Just' !a | Nothing' deriving Int -> Maybe' a -> ShowS
forall a. Show a => Int -> Maybe' a -> ShowS
forall a. Show a => [Maybe' a] -> ShowS
forall a. Show a => Maybe' a -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Maybe' a] -> ShowS
$cshowList :: forall a. Show a => [Maybe' a] -> ShowS
show :: Maybe' a -> String
$cshow :: forall a. Show a => Maybe' a -> String
showsPrec :: Int -> Maybe' a -> ShowS
$cshowsPrec :: forall a. Show a => Int -> Maybe' a -> ShowS
Show
{-# INLINE toMaybe #-}
toMaybe :: Maybe' a -> Maybe a
toMaybe :: forall a. Maybe' a -> Maybe a
toMaybe Maybe' a
Nothing' = forall a. Maybe a
Nothing
toMaybe (Just' a
a) = forall a. a -> Maybe a
Just a
a
{-# INLINE fromJust' #-}
fromJust' :: Maybe' a -> a
fromJust' :: forall a. Maybe' a -> a
fromJust' (Just' a
a) = a
a
fromJust' Maybe' a
Nothing' = forall a. HasCallStack => String -> a
error String
"fromJust' cannot be run in Nothing'"
{-# INLINE isJust' #-}
isJust' :: Maybe' a -> Bool
isJust' :: forall a. Maybe' a -> Bool
isJust' (Just' a
_) = Bool
True
isJust' Maybe' a
Nothing' = Bool
False