module Control.Exception where
import FFI
onException :: Fay a -> Fay a -> Fay a
onException :: Fay a -> Fay a -> Fay a
onException = [Char] -> Fay a -> Fay a -> Fay a
forall s a. IsString s => s -> a
ffi [Char]
"function() { try { return %1(); } catch(e) { return %2(); } }()"
catch :: Fay a -> (Automatic e -> Fay a) -> Fay a
catch :: Fay a -> (Automatic e -> Fay a) -> Fay a
catch = [Char] -> Fay a -> (Automatic e -> Fay a) -> Fay a
forall s a. IsString s => s -> a
ffi [Char]
"function() { try { return %1(); } catch(e) { return %2(e); } }()"
throw :: Automatic e -> Fay a
throw :: Automatic e -> Fay a
throw = [Char] -> Automatic e -> Fay a
forall s a. IsString s => s -> a
ffi [Char]
"(function() { throw %1 })()"