{-# LANGUAGE Trustworthy #-}

-- | A Safe Haskell-trusted re-export of the @srcloc@ package.
module Futhark.Util.Loc (module Data.Loc) where

import Data.Loc