{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE Strict #-}
module VtUtils.Prelude
( Bool(True, False), Either(Left, Right), Eq, Int, IO, Maybe(Just, Nothing), Read, Show, String
, (+), (-), (*), (/), (>), (>=), (<), (<=), (==), (/=), (.), ($), ($!), (>>), (>>=), (&&), (||), (<$>), (<*>)
, abs, div, error, flip, fmap, fromIntegral, id, mapM, mapM_, mod, not, otherwise
, pure, read, return, seq, sequence, sequence_, show, undefined
, SomeException
, bracket, bracket_, throw, try
, forM, forM_, unless, when
, runST
, FromJSON, ToJSON, Value
, (.=)
, object, parseJSON, toJSON
, ByteString
, HashMap
, lookup
, Int64
, fromJust, isJust
, (<>)
, Text
, pack, unpack
, decodeUtf8, encodeUtf8
, appendFile, putStrLn, readFile, writeFile
, toStrict
, Builder, fromText, fromLazyText, fromString, toLazyText
, UTCTime
, getCurrentTime
, Typeable
, cast
, Vector
, (!)
, fromList, toList
, trace
, CString
, Generic
, dateFormat, dateFormatISO8601, dateParseISO8601
, fsCopyDirectory
, ioWithFileBytes, ioWithFileText
, jsonDecodeFile,jsonDecodeText, jsonEncodeText, jsonGet
, mapGet
, Parser
, parsecLineContains, parsecLinePrefix, parsecLineNoPrefix, parsecSkipLines, parsecSkipManyTill
, parsecTry, parsecWhitespace, parsecErrorToText, parsecParseFile, parsecParseText
, pathIsAbsolute, pathConcat, pathPrepend
, textShow
) where
import Prelude
( Bool(True, False), Either(Left, Right), Eq, Int, IO, Maybe(Just, Nothing), Read, Show, String
, (+), (-), (*), (/), (>), (>=), (<), (<=), (==), (/=), (.), ($), ($!), (>>), (>>=), (&&), (&&), (||), (<$>), (<*>)
, abs, div, error, flip, fmap, fromIntegral, id, mapM, mapM_, mod, not, otherwise
, pure, read, return, seq, sequence, sequence_, show, undefined
)
import Control.Exception (SomeException, bracket, bracket_, throw, try)
import Control.Monad (forM, forM_, unless, when)
import Control.Monad.ST (runST)
import Data.Aeson (FromJSON, ToJSON, Value, (.=), object, parseJSON, toJSON)
import Data.ByteString (ByteString)
import Data.HashMap.Strict (HashMap, lookup)
import Data.Int (Int64)
import Data.Maybe (fromJust, isJust)
import Data.Monoid ((<>))
import Data.Text (Text, pack, unpack)
import Data.Text.Encoding (decodeUtf8, encodeUtf8)
import Data.Text.IO (appendFile, putStrLn, readFile, writeFile)
import Data.Text.Lazy (toStrict)
import Data.Text.Lazy.Builder (Builder, fromText, fromLazyText, fromString, toLazyText)
import Data.Time.Clock (UTCTime, getCurrentTime)
import Data.Typeable (Typeable, cast)
import Data.Vector (Vector, (!), fromList, toList)
import Debug.Trace (trace)
import Foreign.C.String (CString)
import GHC.Generics (Generic)
import VtUtils.Date (dateFormat, dateFormatISO8601, dateParseISO8601)
import VtUtils.FS (fsCopyDirectory)
import VtUtils.IO (ioWithFileBytes, ioWithFileText)
import VtUtils.Json (jsonDecodeFile,jsonDecodeText, jsonEncodeText, jsonGet)
import VtUtils.Map (mapGet)
import VtUtils.Parsec (Parser, parsecLineContains, parsecLinePrefix, parsecLineNoPrefix, parsecSkipLines
, parsecSkipManyTill, parsecTry, parsecWhitespace, parsecErrorToText, parsecParseFile, parsecParseText )
import VtUtils.Path (pathIsAbsolute, pathConcat, pathPrepend)
import VtUtils.Text (textShow)