X-Git-Url: http://git.megacz.com/?p=ghc-hetmet.git;a=blobdiff_plain;f=compiler%2Fcmm%2FCmmCallConv.hs;h=830c87911297d68f8cf0a8165c89515508569eff;hp=41b9d5616e502aac4aae34a3d5e9c484efb1c3ee;hb=d25676a6b1c42495702048b6ca6f26ebd15205d8;hpb=5e27c8850b295db6ac171bb626ce1afd0cd3a1eb diff --git a/compiler/cmm/CmmCallConv.hs b/compiler/cmm/CmmCallConv.hs index 41b9d56..830c879 100644 --- a/compiler/cmm/CmmCallConv.hs +++ b/compiler/cmm/CmmCallConv.hs @@ -2,55 +2,117 @@ module CmmCallConv ( ParamLocation(..), ArgumentFormat, assignArguments, + assignArgumentsPos, argumentsSize, ) where #include "HsVersions.h" -import Cmm -import MachOp +import CmmExpr import SMRep +import Cmm (Convention(..)) +import PprCmm () import Constants +import qualified Data.List as L import StaticFlags (opt_Unregisterised) -import Panic +import Outputable -- Calculate the 'GlobalReg' or stack locations for function call -- parameters as used by the Cmm calling convention. -data ParamLocation +data ParamLocation a = RegisterParam GlobalReg - | StackParam WordOff - -type ArgumentFormat a = [(a, ParamLocation)] - -assignArguments :: (a -> MachRep) -> [a] -> ArgumentFormat a -assignArguments f reps = assignments - where - (sizes, assignments) = unzip $ assignArguments' reps (negate (sum sizes)) availRegs - assignArguments' [] offset availRegs = [] - assignArguments' (r:rs) offset availRegs = - (size,(r,assignment)):assignArguments' rs new_offset remaining - where - (assignment, new_offset, size, remaining) = - assign_reg (f r) offset availRegs - -argumentsSize :: (a -> MachRep) -> [a] -> WordOff + | StackParam a + +instance (Outputable a) => Outputable (ParamLocation a) where + ppr (RegisterParam g) = ppr g + ppr (StackParam p) = ppr p + +type ArgumentFormat a b = [(a, ParamLocation b)] + +assignArguments :: (a -> CmmType) -> [a] -> ArgumentFormat a WordOff +-- Stack parameters are returned as word offsets. +assignArguments _ _ = panic "assignArguments only used in dead codegen" -- assignments + +-- | JD: For the new stack story, I want arguments passed on the stack to manifest as +-- positive offsets in a CallArea, not negative offsets from the stack pointer. +-- Also, I want byte offsets, not word offsets. +assignArgumentsPos :: (Outputable a) => Convention -> (a -> CmmType) -> [a] -> + ArgumentFormat a ByteOff +-- Given a list of arguments, and a function that tells their types, +-- return a list showing where each argument is passed +assignArgumentsPos conv arg_ty reps = assignments + where -- The calling conventions (CgCallConv.hs) are complicated, to say the least + regs = case (reps, conv) of + (_, NativeNodeCall) -> getRegsWithNode + (_, NativeDirectCall) -> getRegsWithoutNode + ([_], NativeReturn) -> allRegs + (_, NativeReturn) -> getRegsWithNode + -- GC calling convention *must* put values in registers + (_, GC) -> allRegs + (_, PrimOpCall) -> allRegs + ([_], PrimOpReturn) -> allRegs + (_, PrimOpReturn) -> getRegsWithNode + (_, Slow) -> noRegs + _ -> pprPanic "Unknown calling convention" (ppr conv) + -- The calling conventions first assign arguments to registers, + -- then switch to the stack when we first run out of registers + -- (even if there are still available registers for args of a different type). + -- When returning an unboxed tuple, we also separate the stack + -- arguments by pointerhood. + (reg_assts, stk_args) = assign_regs [] reps regs + stk_args' = case conv of NativeReturn -> part + PrimOpReturn -> part + GC | length stk_args /= 0 -> panic "Failed to allocate registers for GC call" + _ -> stk_args + where part = uncurry (++) + (L.partition (not . isGcPtrType . arg_ty) stk_args) + stk_assts = assign_stk 0 [] (reverse stk_args') + assignments = reg_assts ++ stk_assts + + assign_regs assts [] _ = (assts, []) + assign_regs assts (r:rs) regs = if isFloatType ty then float else int + where float = case (w, regs) of + (W32, (vs, f:fs, ds, ls)) -> k (RegisterParam f, (vs, fs, ds, ls)) + (W64, (vs, fs, d:ds, ls)) -> k (RegisterParam d, (vs, fs, ds, ls)) + (W80, _) -> panic "F80 unsupported register type" + _ -> (assts, (r:rs)) + int = case (w, regs) of + (W128, _) -> panic "W128 unsupported register type" + (_, (v:vs, fs, ds, ls)) | widthInBits w <= widthInBits wordWidth + -> k (RegisterParam (v gcp), (vs, fs, ds, ls)) + (_, (vs, fs, ds, l:ls)) | widthInBits w > widthInBits wordWidth + -> k (RegisterParam l, (vs, fs, ds, ls)) + _ -> (assts, (r:rs)) + k (asst, regs') = assign_regs ((r, asst) : assts) rs regs' + ty = arg_ty r + w = typeWidth ty + gcp | isGcPtrType ty = VGcPtr + | otherwise = VNonGcPtr + + assign_stk _ assts [] = assts + assign_stk offset assts (r:rs) = assign_stk off' ((r, StackParam off') : assts) rs + where w = typeWidth (arg_ty r) + size = (((widthInBytes w - 1) `div` wORD_SIZE) + 1) * wORD_SIZE + off' = offset + size + + +argumentsSize :: (a -> CmmType) -> [a] -> WordOff argumentsSize f reps = maximum (0 : map arg_top args) where args = assignArguments f reps - - arg_top (a, StackParam offset) = -offset + arg_top (_, StackParam offset) = -offset arg_top (_, RegisterParam _) = 0 ----------------------------------------------------------------------------- -- Local information about the registers available -type AvailRegs = ( [GlobalReg] -- available vanilla regs. - , [GlobalReg] -- floats - , [GlobalReg] -- doubles - , [GlobalReg] -- longs (int64 and word64) - ) +type AvailRegs = ( [VGcPtr -> GlobalReg] -- available vanilla regs. + , [GlobalReg] -- floats + , [GlobalReg] -- doubles + , [GlobalReg] -- longs (int64 and word64) + ) -- Vanilla registers can contain pointers, Ints, Chars. -- Floats and doubles have separate register supplies. @@ -58,36 +120,38 @@ type AvailRegs = ( [GlobalReg] -- available vanilla regs. -- We take these register supplies from the *real* registers, i.e. those -- that are guaranteed to map to machine registers. -useVanillaRegs | opt_Unregisterised = 0 - | otherwise = mAX_Real_Vanilla_REG -useFloatRegs | opt_Unregisterised = 0 - | otherwise = mAX_Real_Float_REG -useDoubleRegs | opt_Unregisterised = 0 - | otherwise = mAX_Real_Double_REG -useLongRegs | opt_Unregisterised = 0 - | otherwise = mAX_Real_Long_REG - -availRegs = (regList VanillaReg useVanillaRegs, - regList FloatReg useFloatRegs, - regList DoubleReg useDoubleRegs, - regList LongReg useLongRegs) - where - regList f max = map f [1 .. max] - -slot_size :: LocalReg -> Int -slot_size reg = - ((machRepByteWidth (localRegRep reg) - 1) `div` wORD_SIZE) + 1 - -slot_size' :: MachRep -> Int -slot_size' reg = ((machRepByteWidth reg - 1) `div` wORD_SIZE) + 1 - -assign_reg :: MachRep -> WordOff -> AvailRegs -> (ParamLocation, WordOff, WordOff, AvailRegs) -assign_reg I8 off (v:vs, fs, ds, ls) = (RegisterParam $ v, off, 0, (vs, fs, ds, ls)) -assign_reg I16 off (v:vs, fs, ds, ls) = (RegisterParam $ v, off, 0, (vs, fs, ds, ls)) -assign_reg I32 off (v:vs, fs, ds, ls) = (RegisterParam $ v, off, 0, (vs, fs, ds, ls)) -assign_reg I64 off (vs, fs, ds, l:ls) = (RegisterParam $ l, off, 0, (vs, fs, ds, ls)) -assign_reg I128 off _ = panic "I128 is not a supported register type" -assign_reg F32 off (vs, f:fs, ds, ls) = (RegisterParam $ f, off, 0, (vs, fs, ds, ls)) -assign_reg F64 off (vs, fs, d:ds, ls) = (RegisterParam $ d, off, 0, (vs, fs, ds, ls)) -assign_reg F80 off _ = panic "F80 is not a supported register type" -assign_reg reg off _ = (StackParam $ off, off + size, size, ([], [], [], [])) where size = slot_size' reg +vanillaRegNos, floatRegNos, doubleRegNos, longRegNos :: [Int] +vanillaRegNos | opt_Unregisterised = [] + | otherwise = regList mAX_Real_Vanilla_REG +floatRegNos | opt_Unregisterised = [] + | otherwise = regList mAX_Real_Float_REG +doubleRegNos | opt_Unregisterised = [] + | otherwise = regList mAX_Real_Double_REG +longRegNos | opt_Unregisterised = [] + | otherwise = regList mAX_Real_Long_REG + +-- +getRegsWithoutNode, getRegsWithNode :: AvailRegs +getRegsWithoutNode = + (filter (\r -> r VGcPtr /= node) intRegs, + map FloatReg floatRegNos, map DoubleReg doubleRegNos, map LongReg longRegNos) + where intRegs = map VanillaReg vanillaRegNos +getRegsWithNode = + (intRegs, map FloatReg floatRegNos, map DoubleReg doubleRegNos, map LongReg longRegNos) + where intRegs = map VanillaReg vanillaRegNos + +allVanillaRegNos, allFloatRegNos, allDoubleRegNos, allLongRegNos :: [Int] +allVanillaRegNos = regList mAX_Vanilla_REG +allFloatRegNos = regList mAX_Float_REG +allDoubleRegNos = regList mAX_Double_REG +allLongRegNos = regList mAX_Long_REG + +regList :: Int -> [Int] +regList n = [1 .. n] + +allRegs :: AvailRegs +allRegs = (map VanillaReg allVanillaRegNos, map FloatReg allFloatRegNos, + map DoubleReg allDoubleRegNos, map LongReg allLongRegNos) + +noRegs :: AvailRegs +noRegs = ([], [], [], [])