Class ExpressionsAdapterFactory

    • Field Detail

      • modelPackage

        protected static ExpressionsPackage modelPackage
        The cached model package.
        Generated class or method.
      • modelSwitch

        protected ExpressionsSwitch<Adapter> modelSwitch
        The switch that delegates to the createXXX methods.
        Generated class or method.
    • Constructor Detail

      • ExpressionsAdapterFactory

        public ExpressionsAdapterFactory()
        Creates an instance of the adapter factory.
        Generated class or method.
    • Method Detail

      • isFactoryForType

        public boolean isFactoryForType​(Object object)
        Returns whether this factory is applicable for the type of the object. This implementation returns true if the object is either the model's package or is an instance object of the model.
        Specified by:
        isFactoryForType in interface AdapterFactory
        Overrides:
        isFactoryForType in class AdapterFactoryImpl
        Returns:
        whether this factory is applicable for the type of the object.
        Generated class or method.
      • createAdapter

        public Adapter createAdapter​(Notifier target)
        Creates an adapter for the target.
        Overrides:
        createAdapter in class AdapterFactoryImpl
        Parameters:
        target - the object to adapt.
        Returns:
        the adapter for the target.
        Generated class or method.
      • createExpressionAdapter

        public Adapter createExpressionAdapter()
        Creates a new adapter for an object of class 'Expression'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Expression
        Generated class or method.
      • createUnaryExpressionAdapter

        public Adapter createUnaryExpressionAdapter()
        Creates a new adapter for an object of class 'Unary Expression'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        UnaryExpression
        Generated class or method.
      • createBinaryExpressionAdapter

        public Adapter createBinaryExpressionAdapter()
        Creates a new adapter for an object of class 'Binary Expression'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        BinaryExpression
        Generated class or method.
      • createLogicalOrAdapter

        public Adapter createLogicalOrAdapter()
        Creates a new adapter for an object of class 'Logical Or'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        LogicalOr
        Generated class or method.
      • createConditionAdapter

        public Adapter createConditionAdapter()
        Creates a new adapter for an object of class 'Condition'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Condition
        Generated class or method.
      • createSoftCutAdapter

        public Adapter createSoftCutAdapter()
        Creates a new adapter for an object of class 'Soft Cut'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        SoftCut
        Generated class or method.
      • createLogicalAndAdapter

        public Adapter createLogicalAndAdapter()
        Creates a new adapter for an object of class 'Logical And'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        LogicalAnd
        Generated class or method.
      • createNotProvableAdapter

        public Adapter createNotProvableAdapter()
        Creates a new adapter for an object of class 'Not Provable'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        NotProvable
        Generated class or method.
      • createLessThanAdapter

        public Adapter createLessThanAdapter()
        Creates a new adapter for an object of class 'Less Than'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        LessThan
        Generated class or method.
      • createUnificationAdapter

        public Adapter createUnificationAdapter()
        Creates a new adapter for an object of class 'Unification'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Unification
        Generated class or method.
      • createUnivAdapter

        public Adapter createUnivAdapter()
        Creates a new adapter for an object of class 'Univ'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Univ
        Generated class or method.
      • createStructuralEquivalenceAdapter

        public Adapter createStructuralEquivalenceAdapter()
        Creates a new adapter for an object of class 'Structural Equivalence'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        StructuralEquivalence
        Generated class or method.
      • createStructuralEquivalenceNotProvableAdapter

        public Adapter createStructuralEquivalenceNotProvableAdapter()
        Creates a new adapter for an object of class 'Structural Equivalence Not Provable'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        StructuralEquivalenceNotProvable
        Generated class or method.
      • createNumberEqualAdapter

        public Adapter createNumberEqualAdapter()
        Creates a new adapter for an object of class 'Number Equal'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        NumberEqual
        Generated class or method.
      • createLessOrEqualAdapter

        public Adapter createLessOrEqualAdapter()
        Creates a new adapter for an object of class 'Less Or Equal'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        LessOrEqual
        Generated class or method.
      • createEquivalenceAdapter

        public Adapter createEquivalenceAdapter()
        Creates a new adapter for an object of class 'Equivalence'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Equivalence
        Generated class or method.
      • createNonEqualNumberAdapter

        public Adapter createNonEqualNumberAdapter()
        Creates a new adapter for an object of class 'Non Equal Number'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        NonEqualNumber
        Generated class or method.
      • createGreaterThanAdapter

        public Adapter createGreaterThanAdapter()
        Creates a new adapter for an object of class 'Greater Than'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        GreaterThan
        Generated class or method.
      • createGreaterOrEqualAdapter

        public Adapter createGreaterOrEqualAdapter()
        Creates a new adapter for an object of class 'Greater Or Equal'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        GreaterOrEqual
        Generated class or method.
      • createStandardOrderBeforeAdapter

        public Adapter createStandardOrderBeforeAdapter()
        Creates a new adapter for an object of class 'Standard Order Before'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        StandardOrderBefore
        Generated class or method.
      • createEqualOrStandardOrderBeforeAdapter

        public Adapter createEqualOrStandardOrderBeforeAdapter()
        Creates a new adapter for an object of class 'Equal Or Standard Order Before'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        EqualOrStandardOrderBefore
        Generated class or method.
      • createStandardOrderAfterAdapter

        public Adapter createStandardOrderAfterAdapter()
        Creates a new adapter for an object of class 'Standard Order After'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        StandardOrderAfter
        Generated class or method.
      • createEqualOrStandardOrderAfterAdapter

        public Adapter createEqualOrStandardOrderAfterAdapter()
        Creates a new adapter for an object of class 'Equal Or Standard Order After'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        EqualOrStandardOrderAfter
        Generated class or method.
      • createNotUnifiableAdapter

        public Adapter createNotUnifiableAdapter()
        Creates a new adapter for an object of class 'Not Unifiable'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        NotUnifiable
        Generated class or method.
      • createDisequalityAdapter

        public Adapter createDisequalityAdapter()
        Creates a new adapter for an object of class 'Disequality'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Disequality
        Generated class or method.
      • createAsAdapter

        public Adapter createAsAdapter()
        Creates a new adapter for an object of class 'As'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        As
        Generated class or method.
      • createIsAdapter

        public Adapter createIsAdapter()
        Creates a new adapter for an object of class 'Is'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Is
        Generated class or method.
      • createParticalUnificationAdapter

        public Adapter createParticalUnificationAdapter()
        Creates a new adapter for an object of class 'Partical Unification'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        ParticalUnification
        Generated class or method.
      • createSubDictAdapter

        public Adapter createSubDictAdapter()
        Creates a new adapter for an object of class 'Sub Dict'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        SubDict
        Generated class or method.
      • createModuleCallAdapter

        public Adapter createModuleCallAdapter()
        Creates a new adapter for an object of class 'Module Call'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        ModuleCall
        Generated class or method.
      • createPlusAdapter

        public Adapter createPlusAdapter()
        Creates a new adapter for an object of class 'Plus'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Plus
        Generated class or method.
      • createMinusAdapter

        public Adapter createMinusAdapter()
        Creates a new adapter for an object of class 'Minus'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Minus
        Generated class or method.
      • createBinaryAndAdapter

        public Adapter createBinaryAndAdapter()
        Creates a new adapter for an object of class 'Binary And'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        BinaryAnd
        Generated class or method.
      • createBinaryOrAdapter

        public Adapter createBinaryOrAdapter()
        Creates a new adapter for an object of class 'Binary Or'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        BinaryOr
        Generated class or method.
      • createXorAdapter

        public Adapter createXorAdapter()
        Creates a new adapter for an object of class 'Xor'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Xor
        Generated class or method.
      • createMultiplicationAdapter

        public Adapter createMultiplicationAdapter()
        Creates a new adapter for an object of class 'Multiplication'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Multiplication
        Generated class or method.
      • createDivisionAdapter

        public Adapter createDivisionAdapter()
        Creates a new adapter for an object of class 'Division'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Division
        Generated class or method.
      • createIntegerDivisionAdapter

        public Adapter createIntegerDivisionAdapter()
        Creates a new adapter for an object of class 'Integer Division'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        IntegerDivision
        Generated class or method.
      • createDivAdapter

        public Adapter createDivAdapter()
        Creates a new adapter for an object of class 'Div'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Div
        Generated class or method.
      • createRdivAdapter

        public Adapter createRdivAdapter()
        Creates a new adapter for an object of class 'Rdiv'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Rdiv
        Generated class or method.
      • createBitwiseShiftLeftAdapter

        public Adapter createBitwiseShiftLeftAdapter()
        Creates a new adapter for an object of class 'Bitwise Shift Left'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        BitwiseShiftLeft
        Generated class or method.
      • createModAdapter

        public Adapter createModAdapter()
        Creates a new adapter for an object of class 'Mod'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Mod
        Generated class or method.
      • createRemAdapter

        public Adapter createRemAdapter()
        Creates a new adapter for an object of class 'Rem'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Rem
        Generated class or method.
      • createPowerAdapter

        public Adapter createPowerAdapter()
        Creates a new adapter for an object of class 'Power'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        Power
        Generated class or method.
      • createPositiveNumberAdapter

        public Adapter createPositiveNumberAdapter()
        Creates a new adapter for an object of class 'Positive Number'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        PositiveNumber
        Generated class or method.
      • createNegativeNumberAdapter

        public Adapter createNegativeNumberAdapter()
        Creates a new adapter for an object of class 'Negative Number'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        NegativeNumber
        Generated class or method.
      • createBitwiseNegationAdapter

        public Adapter createBitwiseNegationAdapter()
        Creates a new adapter for an object of class 'Bitwise Negation'. This default implementation returns null so that we can easily ignore cases; it's useful to ignore a case when inheritance will catch all the cases anyway.
        Returns:
        the new adapter.
        See Also:
        BitwiseNegation
        Generated class or method.
      • createEObjectAdapter

        public Adapter createEObjectAdapter()
        Creates a new adapter for the default case. This default implementation returns null.
        Returns:
        the new adapter.
        Generated class or method.