-- | Unsafe coerce.

module Unsafe.Coerce where

import FFI

unsafeCoerce :: a -> b
unsafeCoerce :: a -> b
unsafeCoerce = [Char] -> a -> b
forall s a. IsString s => s -> a
ffi [Char]
"%1"