Allgemein
ohne VBA Beispiele letzte Bearbeitung 28.07.19 ![]() |
' **************************************************************
' Modul: Tabelle1 Typ = Element der Mappe(Sheet, Workbook, ...)
' **************************************************************
Option Explicit ' Variablenmdefinition erforderlich
Private Sub Worksheet_Change(ByVal Target As Range)
'***********************************************
'* H. Ziplies *
'* 05.08.09 *
'* erstellt von HajoZiplies@WEB.de *
'* http://Hajo-Excel.de *
'***********************************************
If Target.Address = "$A$6" Then
If Target = 1 Then
ActiveSheet.Shapes("Schaltfläche 1").OLEFormat.Object.Caption = _
"1. Beschriftung"
ElseIf Target = 2 Then
ActiveSheet.Shapes("Schaltfläche 1").OLEFormat.Object.Caption = _
"2. Beschriftung"
Else
ActiveSheet.Shapes("Schaltfläche 1").OLEFormat.Object.Caption = ""
End If
End If
End Sub
Code eingefügt mit: Excel Code Jeanie, angepasst an XHTML |