summaryrefslogtreecommitdiff
path: root/ghc/compiler/prelude/TyProcs.lhs
blob: 546f7e487a6ed8741340d8cf6d58e9fb66d8a631 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
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}