Reply
 
LinkBack Thread Tools Search this Thread Display Modes
  #1   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

Hi I have:

Dim Fname As Variant

Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

This works well, then: note the .Subject line...I am trying to use the Fname
from above in the Subject line. How is that possible? right now I get the
rest but not the Fname

Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("head")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " now is in \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True

  #2   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

As the FName is declared in a different sub to your mail sub the
calue does not pass. If you declare in one sub this only applies to
the procedure its declared in.
You need to declare it either in the declarations section above your
code in the module if both procedures ( determine the value of FName
and the Sub Mail_Selection_Outlook_Body()) are in the same module or
declare it as Public Fname As Variant in the declarations section of a
Module.
Hope this is not too confusing!
Helmut wrote:
Hi I have:

Dim Fname As Variant

Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

This works well, then: note the .Subject line...I am trying to use the Fname
from above in the Subject line. How is that possible? right now I get the
rest but not the Fname

Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("head")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " now is in \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True


  #3   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

the "DIM Fname as Variant" is in a "Public Sub" in the same Module ... that's
why I thought it should remember it.
any other ideas?
Helmut

"stevebriz" wrote:

As the FName is declared in a different sub to your mail sub the
calue does not pass. If you declare in one sub this only applies to
the procedure its declared in.
You need to declare it either in the declarations section above your
code in the module if both procedures ( determine the value of FName
and the Sub Mail_Selection_Outlook_Body()) are in the same module or
declare it as Public Fname As Variant in the declarations section of a
Module.
Hope this is not too confusing!
Helmut wrote:
Hi I have:

Dim Fname As Variant

Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

This works well, then: note the .Subject line...I am trying to use the Fname
from above in the Subject line. How is that possible? right now I get the
rest but not the Fname

Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("head")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " now is in \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True



  #4   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

I have had this happen before....just delcare in the declaration
section. it should solve you problem

  #5   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

Hi,
May I bother you once more with this and give you the three 'subs' and maybe
you can show me the 'fix'....thanks.

=============sub1========
Sub ToCAV()
'
' Macro1 Macro
' Macro recorded 25/07/2006 by IT1
'

'Sort by ID

Application.Run "'" & ActiveWorkbook.Name & "'!Sort_by_ID"

Sheets("ToCAVM").Visible = True
Sheets("ToCAVM").Select
ActiveSheet.Unprotect

Cells.Select
Selection.Copy

Sheets("ToCAV").Visible = True
Sheets("ToCAV").Select
ActiveSheet.Unprotect

Range("A1").Select
Selection.PasteSpecial Paste:=xlPasteValues, Operation:=xlNone,
SkipBlanks _
:=False, Transpose:=False

'Format colum G for Date as dd/mm/yyyy
Columns("G:G").Select
Range("G1").Activate
Selection.NumberFormat = "mm/dd/yyyy"

'Delete rows with '0' value in column 'C'

Dim Lrow As Long
Dim CalcMode As Long
Dim ViewMode As Long
Dim StartRow As Long
Dim EndRow As Long

With Application
CalcMode = .Calculation
.Calculation = xlCalculationManual
.ScreenUpdating = False
End With

ViewMode = ActiveWindow.View
ActiveWindow.View = xlNormalView

With ActiveSheet
.DisplayPageBreaks = False
StartRow = 1
EndRow = .Cells(.Rows.Count, "C").End(xlUp).Row

For Lrow = EndRow To StartRow Step -1

If IsError(.Cells(Lrow, "C").Value) Then
'Do nothing, This avoid a error if there is a error in the
cell

ElseIf .Cells(Lrow, "C").Value = "0" Then .Rows(Lrow).Delete
'This will delete each row with the Value "0" in Column A,
case sensitive.

End If
Next
End With

ActiveWindow.View = ViewMode
With Application
.ScreenUpdating = True
.Calculation = CalcMode
End With

'2 Generate CSV File and Save to CAV-Files
'-----------------------------------------
'FOR GENERIC


Application.Run "'" & ActiveWorkbook.Name & "'!DoTheExport"
Application.Run "'" & ActiveWorkbook.Name &
"'!Mail_Selection_Outlook_Body"


'Close the ToCAV worksheet and go to START
Sheets("ToCAV").Visible = False
Sheets("ToCAVM").Visible = False
Application.Run "'" & ActiveWorkbook.Name & "'!Set_Month"


End Sub

===========sub2================
Public Sub DoTheExport()

'save 'file as' 'mesnumMMYYYY.CSV'

Dim Fname As Variant

'FOR GENERIC
Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

' FOR SHEKEL-SERVER
' Fname = Application.GetSaveAsFilename("\\Cav-new\FILES\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")


If Fname = False Then
MsgBox "You didn't select a file"
Exit Sub
End If

'Running the Public Sub below
ExportToTextFile CStr(Fname), ",", False

End Sub

Public Sub ExportToTextFile(Fname As String, _
Sep As String, SelectionOnly As Boolean)

Dim WholeLine As String
Dim FNum As Integer
Dim RowNdx As Long
Dim ColNdx As Integer
Dim StartRow As Long
Dim EndRow As Long
Dim StartCol As Integer
Dim EndCol As Integer
Dim CellValue As String


Application.ScreenUpdating = False
On Error GoTo EndMacro:
FNum = FreeFile

If SelectionOnly = True Then
With Selection
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
Else
With ActiveSheet.UsedRange
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
End If

Open Fname For Output Access Write As #FNum

For RowNdx = StartRow To EndRow
WholeLine = ""
For ColNdx = StartCol To EndCol
If Cells(RowNdx, ColNdx).Value = "" Then
CellValue = ""
Else
CellValue = Cells(RowNdx, ColNdx).Text
End If
WholeLine = WholeLine & CellValue & Sep
Next ColNdx
WholeLine = Left(WholeLine, Len(WholeLine) - Len(Sep))
Print #FNum, WholeLine
Next RowNdx

EndMacro:
On Error GoTo 0
Application.ScreenUpdating = True
Close #FNum

End Sub
Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'To send the selection use this example (NB: this only works if the
sheet is unprotected)
'Set sh = ActiveSheet
'Set rng = Selection

'unprotect "START"
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("A1000").Select

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("çåãù")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True


'hide rows and columns to show only menu
Sheets("START").Visible = True
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("hidecolumn1").Select
Selection.EntireColumn.Hidden = True
Range("hiderows1").Select
Selection.EntireRow.Hidden = True
Range("hiderows2").Select
Selection.EntireRow.Hidden = True
Range("hiderows4").Select
Selection.EntireRow.Hidden = True
Range("hidecolumn5").Select
Selection.EntireColumn.Hidden = True
Range("A1").Select
ActiveSheet.Protect DrawingObjects:=True, Contents:=True, Scenarios:=True

End Sub



"stevebriz" wrote:

I have had this happen before....just delcare in the declaration
section. it should solve you problem




  #6   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

Are all these sub in tha same module?
which line is it crashing on?
Helmut wrote:
Hi,
May I bother you once more with this and give you the three 'subs' and maybe
you can show me the 'fix'....thanks.

=============sub1========
Sub ToCAV()
'
' Macro1 Macro
' Macro recorded 25/07/2006 by IT1
'

'Sort by ID

Application.Run "'" & ActiveWorkbook.Name & "'!Sort_by_ID"

Sheets("ToCAVM").Visible = True
Sheets("ToCAVM").Select
ActiveSheet.Unprotect

Cells.Select
Selection.Copy

Sheets("ToCAV").Visible = True
Sheets("ToCAV").Select
ActiveSheet.Unprotect

Range("A1").Select
Selection.PasteSpecial Paste:=xlPasteValues, Operation:=xlNone,
SkipBlanks _
:=False, Transpose:=False

'Format colum G for Date as dd/mm/yyyy
Columns("G:G").Select
Range("G1").Activate
Selection.NumberFormat = "mm/dd/yyyy"

'Delete rows with '0' value in column 'C'

Dim Lrow As Long
Dim CalcMode As Long
Dim ViewMode As Long
Dim StartRow As Long
Dim EndRow As Long

With Application
CalcMode = .Calculation
.Calculation = xlCalculationManual
.ScreenUpdating = False
End With

ViewMode = ActiveWindow.View
ActiveWindow.View = xlNormalView

With ActiveSheet
.DisplayPageBreaks = False
StartRow = 1
EndRow = .Cells(.Rows.Count, "C").End(xlUp).Row

For Lrow = EndRow To StartRow Step -1

If IsError(.Cells(Lrow, "C").Value) Then
'Do nothing, This avoid a error if there is a error in the
cell

ElseIf .Cells(Lrow, "C").Value = "0" Then .Rows(Lrow).Delete
'This will delete each row with the Value "0" in Column A,
case sensitive.

End If
Next
End With

ActiveWindow.View = ViewMode
With Application
.ScreenUpdating = True
.Calculation = CalcMode
End With

'2 Generate CSV File and Save to CAV-Files
'-----------------------------------------
'FOR GENERIC


Application.Run "'" & ActiveWorkbook.Name & "'!DoTheExport"
Application.Run "'" & ActiveWorkbook.Name &
"'!Mail_Selection_Outlook_Body"


'Close the ToCAV worksheet and go to START
Sheets("ToCAV").Visible = False
Sheets("ToCAVM").Visible = False
Application.Run "'" & ActiveWorkbook.Name & "'!Set_Month"


End Sub

===========sub2================
Public Sub DoTheExport()

'save 'file as' 'mesnumMMYYYY.CSV'

Dim Fname As Variant

'FOR GENERIC
Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

' FOR SHEKEL-SERVER
' Fname = Application.GetSaveAsFilename("\\Cav-new\FILES\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")


If Fname = False Then
MsgBox "You didn't select a file"
Exit Sub
End If

'Running the Public Sub below
ExportToTextFile CStr(Fname), ",", False

End Sub

Public Sub ExportToTextFile(Fname As String, _
Sep As String, SelectionOnly As Boolean)

Dim WholeLine As String
Dim FNum As Integer
Dim RowNdx As Long
Dim ColNdx As Integer
Dim StartRow As Long
Dim EndRow As Long
Dim StartCol As Integer
Dim EndCol As Integer
Dim CellValue As String


Application.ScreenUpdating = False
On Error GoTo EndMacro:
FNum = FreeFile

If SelectionOnly = True Then
With Selection
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
Else
With ActiveSheet.UsedRange
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
End If

Open Fname For Output Access Write As #FNum

For RowNdx = StartRow To EndRow
WholeLine = ""
For ColNdx = StartCol To EndCol
If Cells(RowNdx, ColNdx).Value = "" Then
CellValue = ""
Else
CellValue = Cells(RowNdx, ColNdx).Text
End If
WholeLine = WholeLine & CellValue & Sep
Next ColNdx
WholeLine = Left(WholeLine, Len(WholeLine) - Len(Sep))
Print #FNum, WholeLine
Next RowNdx

EndMacro:
On Error GoTo 0
Application.ScreenUpdating = True
Close #FNum

End Sub
Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'To send the selection use this example (NB: this only works if the
sheet is unprotected)
'Set sh = ActiveSheet
'Set rng = Selection

'unprotect "START"
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("A1000").Select

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("çåãù")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True


'hide rows and columns to show only menu
Sheets("START").Visible = True
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("hidecolumn1").Select
Selection.EntireColumn.Hidden = True
Range("hiderows1").Select
Selection.EntireRow.Hidden = True
Range("hiderows2").Select
Selection.EntireRow.Hidden = True
Range("hiderows4").Select
Selection.EntireRow.Hidden = True
Range("hidecolumn5").Select
Selection.EntireColumn.Hidden = True
Range("A1").Select
ActiveSheet.Protect DrawingObjects:=True, Contents:=True, Scenarios:=True

End Sub



"stevebriz" wrote:

I have had this happen before....just delcare in the declaration
section. it should solve you problem



  #7   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

Yes, they are all in the same module.
All is working, nothing crashing, except, it is not putting the "Fname"
where it should in the email:

.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"

the funny characters are hebrew and that is ok. I don't get the Fname in the
subject line in the email.

thanks


"stevebriz" wrote:

Are all these sub in tha same module?
which line is it crashing on?
Helmut wrote:
Hi,
May I bother you once more with this and give you the three 'subs' and maybe
you can show me the 'fix'....thanks.

=============sub1========
Sub ToCAV()
'
' Macro1 Macro
' Macro recorded 25/07/2006 by IT1
'

'Sort by ID

Application.Run "'" & ActiveWorkbook.Name & "'!Sort_by_ID"

Sheets("ToCAVM").Visible = True
Sheets("ToCAVM").Select
ActiveSheet.Unprotect

Cells.Select
Selection.Copy

Sheets("ToCAV").Visible = True
Sheets("ToCAV").Select
ActiveSheet.Unprotect

Range("A1").Select
Selection.PasteSpecial Paste:=xlPasteValues, Operation:=xlNone,
SkipBlanks _
:=False, Transpose:=False

'Format colum G for Date as dd/mm/yyyy
Columns("G:G").Select
Range("G1").Activate
Selection.NumberFormat = "mm/dd/yyyy"

'Delete rows with '0' value in column 'C'

Dim Lrow As Long
Dim CalcMode As Long
Dim ViewMode As Long
Dim StartRow As Long
Dim EndRow As Long

With Application
CalcMode = .Calculation
.Calculation = xlCalculationManual
.ScreenUpdating = False
End With

ViewMode = ActiveWindow.View
ActiveWindow.View = xlNormalView

With ActiveSheet
.DisplayPageBreaks = False
StartRow = 1
EndRow = .Cells(.Rows.Count, "C").End(xlUp).Row

For Lrow = EndRow To StartRow Step -1

If IsError(.Cells(Lrow, "C").Value) Then
'Do nothing, This avoid a error if there is a error in the
cell

ElseIf .Cells(Lrow, "C").Value = "0" Then .Rows(Lrow).Delete
'This will delete each row with the Value "0" in Column A,
case sensitive.

End If
Next
End With

ActiveWindow.View = ViewMode
With Application
.ScreenUpdating = True
.Calculation = CalcMode
End With

'2 Generate CSV File and Save to CAV-Files
'-----------------------------------------
'FOR GENERIC


Application.Run "'" & ActiveWorkbook.Name & "'!DoTheExport"
Application.Run "'" & ActiveWorkbook.Name &
"'!Mail_Selection_Outlook_Body"


'Close the ToCAV worksheet and go to START
Sheets("ToCAV").Visible = False
Sheets("ToCAVM").Visible = False
Application.Run "'" & ActiveWorkbook.Name & "'!Set_Month"


End Sub

===========sub2================
Public Sub DoTheExport()

'save 'file as' 'mesnumMMYYYY.CSV'

Dim Fname As Variant

'FOR GENERIC
Fname = Application.GetSaveAsFilename("c:\MESSER\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")

' FOR SHEKEL-SERVER
' Fname = Application.GetSaveAsFilename("\\Cav-new\FILES\" &
Range("mesnum").Value & "_" & Replace(Range("filedate").Value, "/", "") &
".csv")


If Fname = False Then
MsgBox "You didn't select a file"
Exit Sub
End If

'Running the Public Sub below
ExportToTextFile CStr(Fname), ",", False

End Sub

Public Sub ExportToTextFile(Fname As String, _
Sep As String, SelectionOnly As Boolean)

Dim WholeLine As String
Dim FNum As Integer
Dim RowNdx As Long
Dim ColNdx As Integer
Dim StartRow As Long
Dim EndRow As Long
Dim StartCol As Integer
Dim EndCol As Integer
Dim CellValue As String


Application.ScreenUpdating = False
On Error GoTo EndMacro:
FNum = FreeFile

If SelectionOnly = True Then
With Selection
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
Else
With ActiveSheet.UsedRange
StartRow = .Cells(1).Row
StartCol = .Cells(1).Column
EndRow = .Cells(.Cells.Count).Row
EndCol = .Cells(.Cells.Count).Column
End With
End If

Open Fname For Output Access Write As #FNum

For RowNdx = StartRow To EndRow
WholeLine = ""
For ColNdx = StartCol To EndCol
If Cells(RowNdx, ColNdx).Value = "" Then
CellValue = ""
Else
CellValue = Cells(RowNdx, ColNdx).Text
End If
WholeLine = WholeLine & CellValue & Sep
Next ColNdx
WholeLine = Left(WholeLine, Len(WholeLine) - Len(Sep))
Print #FNum, WholeLine
Next RowNdx

EndMacro:
On Error GoTo 0
Application.ScreenUpdating = True
Close #FNum

End Sub
Sub Mail_Selection_Outlook_Body()
' You must add a reference to the Microsoft outlook Library
' Don't forget to copy the function RangetoHTML in the module.

Dim sh As Worksheet
Dim rng As Range
Dim OutApp As Outlook.Application
Dim OutMail As Outlook.MailItem

'To send the selection use this example (NB: this only works if the
sheet is unprotected)
'Set sh = ActiveSheet
'Set rng = Selection

'unprotect "START"
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("A1000").Select

'If you know the sheet/range then use this two lines
Set sh = Sheets("START")
Set rng = sh.Range("çåãù")

Application.ScreenUpdating = False
Set OutApp = CreateObject("Outlook.Application")
Set OutMail = OutApp.CreateItem(olMailItem)
With OutMail
.To = "
.CC = ""
.BCC = "
.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"
.HTMLBody = RangetoHTML(sh, rng)
.Send 'or use .Display
End With
Set OutMail = Nothing
Set OutApp = Nothing
Application.ScreenUpdating = True


'hide rows and columns to show only menu
Sheets("START").Visible = True
Sheets("START").Select
ActiveSheet.Unprotect
Cells.Select
Selection.EntireRow.Hidden = False
Selection.EntireColumn.Hidden = False
Range("hidecolumn1").Select
Selection.EntireColumn.Hidden = True
Range("hiderows1").Select
Selection.EntireRow.Hidden = True
Range("hiderows2").Select
Selection.EntireRow.Hidden = True
Range("hiderows4").Select
Selection.EntireRow.Hidden = True
Range("hidecolumn5").Select
Selection.EntireColumn.Hidden = True
Range("A1").Select
ActiveSheet.Protect DrawingObjects:=True, Contents:=True, Scenarios:=True

End Sub



"stevebriz" wrote:

I have had this happen before....just delcare in the declaration
section. it should solve you problem




  #8   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

what do you get in the msgbox if you put

Msgbox Fname & "_" & " òëùéå á \\Cav_New\Files"

above your line
.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"

Next try this.

dim SUBSTR as string
SUBSTR = Fname & "_" & " òëùéå á \\Cav_New\Files"
then in your send part of you code
.Subject = SUBSTR

  #9   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

Hi
I get what it puts into the Subject line of the email:
_ עכשיו ב \\Cav_New\Files

Whereas it should be "Fname_ עכשיו ב \\Cav_New\Files"
Helmut

"stevebriz" wrote:

what do you get in the msgbox if you put

Msgbox Fname & "_" & " òëùéå á \\Cav_New\Files"

above your line
.Subject = Fname & "_" & " òëùéå á \\Cav_New\Files"

Next try this.

dim SUBSTR as string
SUBSTR = Fname & "_" & " òëùéå á \\Cav_New\Files"
then in your send part of you code
.Subject = SUBSTR


  #10   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

Helmut ...If you like email me your xls and I see if I can fix the
issue for you.



  #11   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 111
Default filename in "Subject" in email

Thank you...I sent it to your hotmail account

"stevebriz" wrote:

Helmut ...If you like email me your xls and I see if I can fix the
issue for you.


  #12   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 195
Default filename in "Subject" in email

I did not get you email Helmut
steve_briz then the @ hotm.il.com
stevebriz wrote:
Helmut ...If you like email me your xls and I see if I can fix the
issue for you.


  #14   Report Post  
Posted to microsoft.public.excel.programming
external usenet poster
 
Posts: 5,302
Default filename in "Subject" in email

Hi Helmut,

trust you meant: [cut]


Did it occur to you that Steve might have had a reason not to display his
email address in undisguised fashion?

if you don't get it, do you have another email account?


I hope Steve does as, the chances are, your overt publication of the full
address will ensure that he receives plenty of spam mail at the original
account.


---
Regards,
Norman


Reply
Thread Tools Search this Thread
Search this Thread:

Advanced Search
Display Modes

Posting Rules

Smilies are On
[IMG] code is On
HTML code is Off
Trackbacks are On
Pingbacks are On
Refbacks are On


Similar Threads
Thread Thread Starter Forum Replies Last Post
Subject: how to convert 112" to 9'4" with a formula in Excel Mike H Excel Worksheet Functions 2 August 3rd 08 03:22 PM
"CELL("FILENAME") NOT UPDATE AFTER "SAVE AS" ACTION yossie6 Excel Discussion (Misc queries) 1 June 16th 08 12:16 PM
Cell("filename") doesn't update to new filename when do save as. Louis Excel Worksheet Functions 2 March 22nd 07 07:27 PM
textbox value to be used as a "subject" line within an email excelwatcher Excel Worksheet Functions 0 March 7th 06 04:30 AM
Subject: Not showing "info on clipboard" message Gord Dibben[_3_] Excel Programming 0 July 25th 03 10:15 PM


All times are GMT +1. The time now is 05:49 AM.

Powered by vBulletin® Copyright ©2000 - 2024, Jelsoft Enterprises Ltd.
Copyright ©2004-2024 ExcelBanter.
The comments are property of their posters.
 

About Us

"It's about Microsoft Excel"