{-# LANGUAGE CPP #-}
module RIO.Map.Unchecked
  (
  
  
    Data.Map.Strict.mapKeysMonotonic
  
  
  , Data.Map.Strict.toAscList
  , Data.Map.Strict.fromAscList
  , Data.Map.Strict.fromAscListWith
  , Data.Map.Strict.fromAscListWithKey
  , Data.Map.Strict.fromDistinctAscList
#if MIN_VERSION_containers(0,5,8)
  , Data.Map.Strict.toDescList
  , Data.Map.Strict.fromDescList
  , Data.Map.Strict.fromDescListWith
  , Data.Map.Strict.fromDescListWithKey
  , Data.Map.Strict.fromDistinctDescList
#endif
  ) where
import qualified Data.Map.Strict