INPUT BOX ALLOWS FOR A NUMBER OR NUMBER TAKEN ELSEWHERE

Sub Tabellenblatt_umbenennen()
Dim strBlattname As String

    strBlattname = InputBox("Wie soll das Tabellenblatt heißen?", "Blatt umbenennen", _
        ActiveSheet.Name)
    If strBlattname <> "" Then ActiveSheet.Name = strBlattname

End Sub


Sub nachbau_Inputbox()
Dim strInputwert

    strInputwert = InputBox("Ihre Eingabe", "Anwendung umbenennen", Application.Caption)
    If strInputwert <> "" Then Application.Caption = strInputwert
   
End SuB


-------------------------------------------------------------------

Sub Blatt_umbenennen()

    strName = InputBox("Geben Sie etwas ein.", "Kopfzeile", ActiveSheet.Name)

End Sub

-------------------------------------------------------------------

Sub Wert_wiedergeben()


Dim strZahl As Double

    strZahl = Application.InputBox("Geben Sie eine Zahl ein", "Wert", 0, , , , , 1)
    ActiveCell.Value = strZahl
   
End Sub
-------------------------------------------------------------------
Sub Formel_Eintragen()


Dim strFormel As String

    strFormel = Application.InputBox(prompt:="Formel eingeben", Type:=0, Title:="Formel")
    ActiveSheet.Cells(4, 4).Formula = strFormel


End Sub

-------------------------------------------------------------------

Sub Formel_Eintragen2()


Dim strFormel As String

    strFormel = Application.InputBox("Geben Sie eine Formel ein", "Formel", , , , , , 0)
    ActiveSheet.Cells(3, 3).Formula = strFormel
   
End Sub

-------------------------------------------------------------------

Sub Eingabe()


Dim strAnwender As String

    strAnwender = InputBox("Person", "Eingabe", Application.UserName)
   
    If strAnwender <> "" Then
        MsgBox strAnwender
    End If
   
End Sub
-------------------------------------------------------------------

Sub Eingabe2()


Dim Anwender As String

Anwender = Application.InputBox("Person", "Eingabe", "Name")

MsgBox Anwender

End Sub

-------------------------------------------------------------------

Sub Anwendungs_Inputbox()


Dim bolZustand As Boolean

On Error GoTo ErrorHandler

    bolZustand = Application.InputBox(prompt:="Kunde existiert?", Title:="SAP", _
        Default:="Wahr", Type:=4)

    MsgBox "Kunde existiert: " & bolZustand
    Exit Sub

ErrorHandler:
    MsgBox "Fehler"
    Exit Sub


End Sub
-------------------------------------------------------------------

Sub Formel_Uebergeben()

Cells(3, 3).Formula = Application.InputBox(prompt:="Geben Sie eine Formel in Excelschreibweise ein.", Title:="Formel eingeben", Default:="=Summe(" & Selection.Address & ")", Type:=8)

End Sub