Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data Name
- type UiWidget = Widget Name
- data UiVmState = UiVmState {
- _uiVm :: VM
- _uiStep :: Int
- _uiSnapshots :: Map Int (VM, Stepper ())
- _uiStepper :: Stepper ()
- _uiStackList :: List Name (Int, SymWord)
- _uiBytecodeList :: List Name (Int, Op)
- _uiTraceList :: List Name Text
- _uiSolidityList :: List Name (Int, ByteString)
- _uiMessage :: Maybe String
- _uiShowMemory :: Bool
- _uiSolc :: Maybe SolcContract
- _uiTestOpts :: UnitTestOptions
- data UiTestPickerState = UiTestPickerState {}
- data UiBrowserState = UiBrowserState {}
- data UiState
- uiVm :: Lens' UiVmState VM
- uiTraceList :: Lens' UiVmState (List Name Text)
- uiTestOpts :: Lens' UiVmState UnitTestOptions
- uiStepper :: Lens' UiVmState (Stepper ())
- uiStep :: Lens' UiVmState Int
- uiStackList :: Lens' UiVmState (List Name (Int, SymWord))
- uiSolidityList :: Lens' UiVmState (List Name (Int, ByteString))
- uiSolc :: Lens' UiVmState (Maybe SolcContract)
- uiSnapshots :: Lens' UiVmState (Map Int (VM, Stepper ()))
- uiShowMemory :: Lens' UiVmState Bool
- uiMessage :: Lens' UiVmState (Maybe String)
- uiBytecodeList :: Lens' UiVmState (List Name (Int, Op))
- testPickerList :: Lens' UiTestPickerState (List Name (Text, Text))
- testPickerDapp :: Lens' UiTestPickerState DappInfo
- testOpts :: Lens' UiTestPickerState UnitTestOptions
- browserVm :: Lens' UiBrowserState UiVmState
- browserContractList :: Lens' UiBrowserState (List Name (Addr, Contract))
- _ViewHelp :: Prism' UiState UiVmState
- _ViewPicker :: Prism' UiState UiTestPickerState
- _ViewContracts :: Prism' UiState UiBrowserState
- _ViewVm :: Prism' UiState UiVmState
- snapshotInterval :: Int
- type Pred a = a -> Bool
- data StepMode
- data Continuation a
- interpret :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => StepMode -> Stepper a -> StateT UiVmState IO (Continuation a)
- isUnitTestContract :: Text -> DappInfo -> Bool
- mkVty :: IO Vty
- runFromVM :: Maybe Integer -> DappInfo -> (Query -> IO (EVM ())) -> VM -> IO VM
- initUiVmState :: VM -> UnitTestOptions -> Stepper () -> UiVmState
- concreteTests :: UnitTestOptions -> (Text, [(Text, [AbiType])]) -> [(Text, Text)]
- main :: UnitTestOptions -> FilePath -> FilePath -> IO ()
- takeStep :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiVmState -> StepMode -> EventM n (Next UiState)
- backstep :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiVmState -> EventM n UiVmState
- appEvent :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiState -> BrickEvent Name e -> EventM Name (Next UiState)
- app :: UnitTestOptions -> App UiState () Name
- initialUiVmStateForTest :: UnitTestOptions -> (Text, Text) -> UiVmState
- myTheme :: [(AttrName, Attr)]
- drawUi :: UiState -> [UiWidget]
- drawHelpView :: [UiWidget]
- drawTestPicker :: UiTestPickerState -> [UiWidget]
- drawVmBrowser :: UiBrowserState -> [UiWidget]
- drawVm :: UiVmState -> [UiWidget]
- drawHelpBar :: UiWidget
- stepOneOpcode :: Stepper a -> StateT UiVmState IO ()
- isNextSourcePosition :: UiVmState -> Pred VM
- isNextSourcePositionWithoutEntering :: UiVmState -> Pred VM
- isExecutionHalted :: UiVmState -> Pred VM
- currentSrcMap :: DappInfo -> VM -> Maybe SrcMap
- currentSolc :: DappInfo -> VM -> Maybe SolcContract
- renderVm :: UiVmState -> UiVmState
- updateUiVmState :: UiVmState -> VM -> UiVmState
- drawStackPane :: UiVmState -> UiWidget
- drawBytecodePane :: UiVmState -> UiWidget
- dim :: Widget n -> Widget n
- withHighlight :: Bool -> Widget n -> Widget n
- prettyIfConcrete :: Buffer -> String
- drawTracePane :: UiVmState -> UiWidget
- drawSolidityPane :: UiVmState -> UiWidget
- ifTallEnough :: Int -> Widget n -> Widget n -> Widget n
- opWidget :: (Integral a, Show a) => (a, Op) -> Widget n
- selectedAttr :: AttrName
- dimAttr :: AttrName
- wordAttr :: AttrName
- boldAttr :: AttrName
- activeAttr :: AttrName
Documentation
UiVmState | |
|
data UiTestPickerState Source #
data UiBrowserState Source #
uiSolidityList :: Lens' UiVmState (List Name (Int, ByteString)) Source #
testPickerList :: Lens' UiTestPickerState (List Name (Text, Text)) Source #
data Continuation a Source #
Each step command in the terminal should finish immediately with one of these outcomes.
interpret :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => StepMode -> Stepper a -> StateT UiVmState IO (Continuation a) Source #
This turns a Stepper
into a state action usable
from within the TTY loop, yielding a StepOutcome
depending on the StepMode
.
initUiVmState :: VM -> UnitTestOptions -> Stepper () -> UiVmState Source #
concreteTests :: UnitTestOptions -> (Text, [(Text, [AbiType])]) -> [(Text, Text)] Source #
takeStep :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiVmState -> StepMode -> EventM n (Next UiState) Source #
backstep :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiVmState -> EventM n UiVmState Source #
appEvent :: (?fetcher :: Fetcher, ?maxIter :: Maybe Integer) => UiState -> BrickEvent Name e -> EventM Name (Next UiState) Source #
initialUiVmStateForTest :: UnitTestOptions -> (Text, Text) -> UiVmState Source #
drawHelpView :: [UiWidget] Source #
drawTestPicker :: UiTestPickerState -> [UiWidget] Source #
drawVmBrowser :: UiBrowserState -> [UiWidget] Source #
currentSolc :: DappInfo -> VM -> Maybe SolcContract Source #
drawStackPane :: UiVmState -> UiWidget Source #
drawBytecodePane :: UiVmState -> UiWidget Source #
prettyIfConcrete :: Buffer -> String Source #
drawTracePane :: UiVmState -> UiWidget Source #
drawSolidityPane :: UiVmState -> UiWidget Source #