diff options
Diffstat (limited to 'ghc/compiler/prelude/TyProcs.lhs')
-rw-r--r-- | ghc/compiler/prelude/TyProcs.lhs | 26 |
1 files changed, 26 insertions, 0 deletions
diff --git a/ghc/compiler/prelude/TyProcs.lhs b/ghc/compiler/prelude/TyProcs.lhs new file mode 100644 index 0000000000..546f7e487a --- /dev/null +++ b/ghc/compiler/prelude/TyProcs.lhs @@ -0,0 +1,26 @@ +% +% (c) The GRASP Project, Glasgow University, 1992 +% +\section[TyProcessor]{The processor datatypes} + +This is used only for ``Data Parallel Haskell.'' + +\begin{code} +#include "HsVersions.h" + +module TyProcs where + +import PrelFuns -- help functions, types and things +import PrelUniqs + +import AbsUniType ( applyTyCon, mkProcessorTyCon ) +import Util + +mkProcessorTy :: [UniType] -> UniType -> UniType +mkProcessorTy tys ty + = applyTyCon (mkProcessorTyCon (length tys)) (tys++[ty]) + +processor1TyCon = mkProcessorTyCon (1::Int) +processor2TyCon = mkProcessorTyCon (2::Int) +processor3TyCon = mkProcessorTyCon (3::Int) +\end{code} |