-----------------------------------------------------------------------------
-- |
-- Module      :  ForSyDe.Deep.Ids
-- Copyright   :  (c) ES Group, KTH/ICT/ES 2007-2013
-- License     :  BSD-style (see the file LICENSE)
-- 
-- Maintainer  :  forsyde-dev@ict.kth.se
-- Stability   :  experimental
-- Portability :  portable
--
-- ForSyDe  identifier types
--
-----------------------------------------------------------------------------
module ForSyDe.Deep.Ids where

-- | A process identifier
type ProcId = String

-- | A Port identifier
type PortId = String

-- | A System identifier
type SysId = String