1 {-# LANGUAGE FieldSelectors #-}
2 {-# LANGUAGE UndecidableInstances #-}
3 {-# LANGUAGE NoMonomorphismRestriction #-}
4 {-# OPTIONS_GHC -Wno-deprecations #-}
5 {-# OPTIONS_GHC -Wno-orphans #-}
7 module Literate.Prelude (
8 module Literate.Prelude,
9 module Literate.Rebindable,
130 import Control.Applicative (Applicative (..))
131 import Control.Arrow (first, second, (>>>))
132 import Control.Monad (foldM, foldM_, forM, forM_, mapM, mapM_, unless, void, when)
133 import Data.Bool (Bool (..), not, otherwise, (&&), (||))
134 import Data.Char (Char)
135 import Data.Either (Either (..), either, fromRight, lefts, partitionEithers, rights)
136 import Data.Eq (Eq (..))
137 import Data.Foldable (Foldable (..), all, and, any, fold, foldMap, foldr, maximum, minimum, null, or)
138 import Data.Function (const, flip, id, on, ($), (&), (.))
139 import Data.Functor (Functor (..), ($>), (<$), (<$>), (<&>))
140 import Data.Functor.Identity (Identity (..))
141 import Data.List ((++))
142 import Data.List qualified as List
143 import Data.List.NonEmpty (NonEmpty (..), nonEmpty)
144 import Data.List.NonEmpty qualified as NonEmpty
145 import Data.Map.Merge.Strict qualified as Map
146 import Data.Map.Strict (Map)
147 import Data.Map.Strict qualified as Map
148 import Data.Maybe (Maybe (..), catMaybes, fromMaybe, isJust, isNothing, listToMaybe, mapMaybe, maybe, maybeToList)
149 import Data.Monoid (Ap (..), Endo (..), Last (..), Monoid (..))
150 import Data.Ord (Down (..), Ord (..), Ordering (..))
151 import Data.Proxy (Proxy (..))
152 import Data.Ratio (Ratio, Rational)
153 import Data.Semigroup (Max (..), Min (..), Semigroup (..), Sum (..))
154 import Data.Set (Set)
155 import Data.Set qualified as Set
156 import Data.String (String)
157 import Data.Text (Text)
158 import Data.Text qualified as Text
159 import Data.Text.Lazy qualified as Text.Lazy
160 import Data.Text.Short (ShortText)
161 import Data.Text.Short qualified as Text.Short
162 import Data.Tuple (curry, fst, snd, uncurry)
163 import Debug.Pretty.Simple (pTrace, pTraceM, pTraceShow, pTraceShowId, pTraceShowM)
164 import GHC.Generics (Generic, Generically (..))
165 import GHC.OverloadedLabels (IsLabel (..))
166 import GHC.Stack (HasCallStack)
167 import GHC.TypeLits (KnownNat (..), KnownSymbol (..), Symbol, natVal, symbolVal)
168 import Literate.Rebindable
169 import Numeric.Natural (Natural)
170 import Paths_literate_invoice qualified as Self
171 import System.IO (FilePath, IO)
172 import System.IO qualified as Sys
173 import Text.Pretty.Simple (pHPrint, pShow, pShowNoColor)
174 import Text.Show (Show (..))
175 import Type.Reflection (Typeable)
176 import Prelude (Double, Enum (..), Int, Integer, Real (..), error, even, fromIntegral, odd)
178 traceStringM = pTraceM
180 traceShow = pTraceShow
181 traceShowId = pTraceShowId
182 traceShowM = pTraceShowM
184 xtraceStringM _ = return ()
188 xtraceShowM _ = return ()
190 pattern (:=) :: a -> b -> (a, b)
191 pattern (:=) x y = (x, y)
194 class Assoc a b c where
196 instance Assoc a b (a, b) where
199 (<&) :: Functor f => a -> f b -> f a
200 (&>) :: Functor f => f b -> a -> f a
206 -- l <>~ n = over l (<> n)
207 -- {-# INLINE (<>~) #-}
209 -- instance IsList a => IsList (Last a) where
210 -- type Item (Last a) = Item a
211 -- fromList [] = Last Nothing
212 -- fromList xs = Last (Just (fromList xs))
213 -- toList (Last Nothing) = []
214 -- toList (Last (Just x)) = IsList.toList x
216 -- | Like `Last` but `mempty` is `[]` instead not `Nothing`.
217 -- Useful for deriving:
220 -- deriving Semigroup via (ProductSurgery (OnFields Lasts) Foo)
222 newtype Lasts a = Lasts a
223 deriving (Eq, Ord, Show, Generic)
225 instance Semigroup (Lasts [a]) where
229 instance (Monoid a, Semigroup (Lasts a)) => Monoid (Lasts a) where
230 mempty = Lasts mempty
232 newtype Newest a = Newest {unNewest :: a}
233 deriving (Eq, Ord, Generic)
234 deriving newtype (Show)
235 instance Semigroup (Newest a) where
238 newtype MapUnion k a = MapUnion {unMapUnion :: Map.Map k a}
239 deriving (Eq, Ord, Generic, Functor)
240 deriving newtype (Show)
242 -- CorrectionWarning: as of GHC 9.6.6, `Monoid` is not derived correctly via `Generically`:
243 -- it does not reuses `(<>)`.
244 -- See https://github.com/haskell/core-libraries-committee/issues/324
245 -- deriving (Monoid) via (Generically (MapUnion k a))
246 instance (Ord k, Semigroup a) => Semigroup (MapUnion k a) where
247 MapUnion x <> MapUnion y = MapUnion (Map.unionWith (<>) x y)
248 instance (Ord k, Semigroup a) => Monoid (MapUnion k a) where
249 mempty = MapUnion mempty
250 instance (Ord k, Semigroup a) => IsList (MapUnion k a) where
251 type Item (MapUnion k a) = (k, a)
252 fromList = MapUnion . Map.fromListWith (<>)
253 toList = Map.toList . unMapUnion
255 forMap :: (Foldable t, Monoid m) => t a -> (a -> m) -> m
256 forMap = flip foldMap
258 class DropPrefix a where
259 dropPrefix :: a -> a -> a
260 instance DropPrefix Text.Text where
261 dropPrefix p t = t & Text.stripPrefix p & fromMaybe t
262 instance DropPrefix ShortText where
263 dropPrefix p t = t & Text.Short.stripPrefix p & fromMaybe t
265 setSingle = Set.singleton
266 {-# INLINE setSingle #-}
267 setInsert = Set.insert
268 {-# INLINE setInsert #-}
270 {-# INLINE setSize #-}
272 {-# INLINE mapSize #-}
273 mapEachPiece f g h = Map.merge (Map.mapMissing f) (Map.mapMissing g) (Map.zipWithMatched h)
274 {-# NOINLINE mapEachPiece #-}
276 foldMapM :: (Applicative m, Foldable t, Monoid b) => (a -> m b) -> t a -> m b
277 foldMapM f = getAp <$> foldMap (Ap . f)
279 class ToMaybe a b where
280 toMaybe :: a -> Maybe b
281 instance ToMaybe Int Natural where
283 | x >= 0 = Just (fromIntegral x)
284 | otherwise = Nothing
286 withDataFile n f = do
287 path <- Self.getDataFileName $ n & List.stripPrefix "data/" & fromMaybe n
288 Sys.withFile path Sys.ReadMode f
290 -- | Useful to constrain a literal list to a bare list when using `OverloadedLists`.
295 enumAll = enumFrom (toEnum 0)
300 -- instance Fractional a => Fractional (Last a) where
301 -- fromRational = Last . Just . fromRational
303 -- recip = fmap recip
304 -- instance Num a => Num (Last a) where
309 -- signum = fmap signum
310 -- fromInteger = Last . Just . fromInteger
312 class Boolable a where
316 instance Boolable Bool where
319 instance Boolable a => Boolable (Last a) where
326 lookup :: Key a -> a -> Maybe (Value a)
327 instance Ord k => Lookup (Map k a) where
328 type Key (Map k a) = k
329 type Value (Map k a) = a
331 instance Ord a => Lookup (Set a) where
333 type Value (Set a) = ()
335 | Set.member k m = Just ()
336 | otherwise = Nothing
337 instance Ord a => Lookup [a] where
341 | List.elem k m = Just ()
342 | otherwise = Nothing
343 instance Ord k => Lookup (MapUnion k a) where
344 type Key (MapUnion k a) = Key (Map k a)
345 type Value (MapUnion k a) = Value (Map k a)
346 lookup k = unMapUnion >>> lookup k
347 instance Lookup a => Lookup (Last a) where
348 type Key (Last a) = Key a
349 type Value (Last a) = Value a
350 lookup k = getLast >>> maybe Nothing (lookup k)
352 lookupOrDefaultTo d k = lookup k >>> fromMaybe d
353 {-# INLINE lookupOrDefaultTo #-}
355 type Modifier a = a -> a
357 nonEmptyHead = NonEmpty.head
359 headMaybe = listToMaybe
362 | otherwise = Just (List.last xs)
364 chunksOf :: Int -> [a] -> [[a]]
366 chunksOf n xs = ys : chunksOf n zs
368 (ys, zs) = List.splitAt n xs
370 mapFromListCheckingDuplicates :: HasCallStack => Ord k => Show k => [(k, v)] -> Map k v
371 mapFromListCheckingDuplicates = Map.fromListWithKey (\key -> errorShow ("key duplicate" :: Text, key))
373 errorShow :: HasCallStack => Show a => a -> b
374 errorShow x = error $ pShowNoColor x & Text.Lazy.unpack
376 mapButLast :: (a -> a) -> [a] -> [a]
377 mapButLast f (x : y : xs) = f x : mapButLast f (y : xs)
378 mapButLast _f other = other
380 ol0 = List.zip [0 :: Integer ..]
381 ol1 = List.zip [1 :: Integer ..]